MODFLOW 6  version 6.7.0.dev1
USGS Modular Hydrologic Model
tsp-ssm.f90
Go to the documentation of this file.
1 !> @brief This module contains the TspSsm Module
2 !!
3 !! This module contains the code for handling sources and sinks
4 !! associated with groundwater flow model stress packages.
5 !!
6 !! todo: need observations for SSM terms
7 !<
9 
10  use kindmodule, only: dp, i4b, lgp
15  use simvariablesmodule, only: errmsg
17  use basedismodule, only: disbasetype
18  use tspfmimodule, only: tspfmitype
20  use tablemodule, only: tabletype, table_cr
21  use tspspcmodule, only: tspspctype
23 
24  implicit none
25  public :: tspssmtype
26  public :: ssm_cr
27 
28  character(len=LENFTYPE) :: ftype = 'SSM'
29  character(len=LENPACKAGENAME) :: text = ' SOURCE-SINK MIX'
30 
31  !> @brief Derived type for the SSM Package
32  !!
33  !! This derived type corresponds to the SSM Package, which adds
34  !! the effects of groundwater sources and sinks to the solute transport
35  !! equation.
36  !<
37  type, extends(numericalpackagetype) :: tspssmtype
38 
39  integer(I4B), pointer :: nbound !< total number of flow boundaries in this time step
40  integer(I4B), dimension(:), pointer, contiguous :: isrctype => null() !< source type 0 is unspecified, 1 is aux, 2 is auxmixed, 3 is ssmi, 4 is ssmimixed
41  integer(I4B), dimension(:), pointer, contiguous :: iauxpak => null() !< aux col for concentration/temperature
42  integer(I4B), dimension(:), pointer, contiguous :: ibound => null() !< pointer to model ibound
43  real(dp), dimension(:), pointer, contiguous :: cnew => null() !< pointer to gwt%x
44  type(tspfmitype), pointer :: fmi => null() !< pointer to fmi object
45  type(tabletype), pointer :: outputtab => null() !< output table object
46  type(tspspctype), dimension(:), pointer :: ssmivec => null() !< array of stress package concentration or temperature objects
47  real(dp), pointer :: eqnsclfac => null() !< governing equation scale factor; =1. for solute; =rhow*cpw for energy
48  character(len=LENVARNAME) :: depvartype = ''
49 
50  contains
51 
52  procedure :: ssm_df
53  procedure :: ssm_ar
54  procedure :: ssm_rp
55  procedure :: ssm_ad
56  procedure :: ssm_fc
57  procedure :: ssm_cq
58  procedure :: ssm_bd
59  procedure :: ssm_ot_flow
60  procedure :: ssm_da
61  procedure :: allocate_scalars
62  procedure, private :: ssm_term
63  procedure, private :: allocate_arrays
64  procedure, private :: read_options
65  procedure, private :: read_data
66  procedure, private :: read_sources_aux
67  procedure, private :: read_sources_fileinput
68  procedure, private :: pak_setup_outputtab
69  procedure, private :: set_iauxpak
70  procedure, private :: set_ssmivec
71  procedure, private :: get_ssm_conc
72 
73  end type tspssmtype
74 
75 contains
76 
77  !> @ brief Create a new SSM package
78  !!
79  !! Create a new SSM package by defining names, allocating scalars
80  !! and initializing the parser.
81  !<
82  subroutine ssm_cr(ssmobj, name_model, inunit, iout, fmi, eqnsclfac, &
83  depvartype)
84  ! -- dummy
85  type(tspssmtype), pointer :: ssmobj !< TspSsmType object
86  character(len=*), intent(in) :: name_model !< name of the model
87  integer(I4B), intent(in) :: inunit !< fortran unit for input
88  integer(I4B), intent(in) :: iout !< fortran unit for output
89  type(tspfmitype), intent(in), target :: fmi !< Transport FMI package
90  real(dp), intent(in), pointer :: eqnsclfac !< governing equation scale factor
91  character(len=LENVARNAME), intent(in) :: depvartype !< dependent variable type ('concentration' or 'temperature')
92  !
93  ! -- Create the object
94  allocate (ssmobj)
95  !
96  ! -- create name and memory path
97  call ssmobj%set_names(1, name_model, 'SSM', 'SSM')
98  !
99  ! -- Allocate scalars
100  call ssmobj%allocate_scalars()
101  !
102  ! -- Set variables
103  ssmobj%inunit = inunit
104  ssmobj%iout = iout
105  ssmobj%fmi => fmi
106  ssmobj%eqnsclfac => eqnsclfac
107  !
108  ! -- Initialize block parser
109  call ssmobj%parser%Initialize(ssmobj%inunit, ssmobj%iout)
110  !
111  ! -- Store pointer to labels associated with the current model so that the
112  ! package has access to the corresponding dependent variable type
113  ssmobj%depvartype = depvartype
114  end subroutine ssm_cr
115 
116  !> @ brief Define SSM Package
117  !!
118  !! This routine is called from gwt_df(), but does not do anything because
119  !! df is typically used to set up dimensions. For the ssm package, the
120  !! total number of ssm entries is defined by the flow model.
121  !<
122  subroutine ssm_df(this)
123  ! -- modules
125  ! -- dummy
126  class(tspssmtype) :: this !< TspSsmType object
127  end subroutine ssm_df
128 
129  !> @ brief Allocate and read SSM Package
130  !!
131  !! This routine is called from gwt_ar(). It allocates arrays, reads
132  !! options and data, and sets up the output table.
133  !<
134  subroutine ssm_ar(this, dis, ibound, cnew)
135  ! -- modules
137  ! -- dummy
138  class(tspssmtype) :: this !< TspSsmType object
139  class(disbasetype), pointer, intent(in) :: dis !< discretization package
140  integer(I4B), dimension(:), pointer, contiguous :: ibound !< GWT model ibound
141  real(DP), dimension(:), pointer, contiguous :: cnew !< GWT model dependent variable
142  ! -- formats
143  character(len=*), parameter :: fmtssm = &
144  "(1x,/1x,'SSM -- SOURCE-SINK MIXING PACKAGE, VERSION 1, 8/25/2017', &
145  &' INPUT READ FROM UNIT ', i0, //)"
146  !
147  ! -- print a message identifying the storage package.
148  write (this%iout, fmtssm) this%inunit
149  !
150  ! -- store pointers to arguments that were passed in
151  this%dis => dis
152  this%ibound => ibound
153  this%cnew => cnew
154  !
155  ! -- Check to make sure that there are flow packages
156  if (this%fmi%nflowpack == 0) then
157  write (errmsg, '(a)') 'SSM package does not detect any boundary flows &
158  &that require SSM terms. Activate GWF-GWT (or &
159  &GWF-GWE, as appropriate) exchange or activate &
160  &FMI package and provide a budget file that &
161  &contains boundary flows. If no boundary flows &
162  &are present in corresponding GWF model then this &
163  &SSM package should be removed.'
164  call store_error(errmsg)
165  call this%parser%StoreErrorUnit()
166  end if
167  !
168  ! -- Allocate arrays
169  call this%allocate_arrays()
170  !
171  ! -- Read ssm options
172  call this%read_options()
173  !
174  ! -- read the data block
175  call this%read_data()
176  !
177  ! -- setup the output table
178  call this%pak_setup_outputtab()
179  end subroutine ssm_ar
180 
181  !> @ brief Read and prepare this SSM Package
182  !!
183  !! This routine is called from gwt_rp(). It is called at the beginning of
184  !! each stress period. If any SPC input files are used to provide source
185  !! and sink concentrations (or temperatures), then period blocks for the
186  !! current stress period are read.
187  !<
188  subroutine ssm_rp(this)
189  ! -- dummy
190  class(tspssmtype) :: this !< TspSsmType object
191  ! -- local
192  integer(I4B) :: ip
193  type(tspspctype), pointer :: ssmiptr
194  ! -- formats
195  !
196  ! -- Call the rp method on any ssm input files
197  do ip = 1, this%fmi%nflowpack
198  if (this%fmi%iatp(ip) /= 0) cycle
199  if (this%isrctype(ip) == 3 .or. this%isrctype(ip) == 4) then
200  ssmiptr => this%ssmivec(ip)
201  call ssmiptr%spc_rp()
202  end if
203  end do
204  end subroutine ssm_rp
205 
206  !> @ brief Advance the SSM Package
207  !!
208  !! This routine is called from gwt_ad(). It is called at the beginning of
209  !! each time step. The total number of flow boundaries is counted and stored
210  !! in this%nbound. Also, if any SPC input files are used to provide source
211  !! and sink concentrations (or temperatures) and time series are referenced
212  !! in those files, then ssm concenrations must be interpolated for the time
213  !! step.
214  !<
215  subroutine ssm_ad(this)
216  ! -- dummy
217  class(tspssmtype) :: this !< TspSsmType object
218  ! -- local
219  integer(I4B) :: ip
220  type(tspspctype), pointer :: ssmiptr
221  integer(I4B) :: i
222  integer(I4B) :: node
223  !
224  ! -- Calculate total number of existing flow boundaries. It is possible
225  ! that a node may equal zero. In this case, the bound should be
226  ! skipped and not written to ssm output.
227  this%nbound = 0
228  do ip = 1, this%fmi%nflowpack
229  if (this%fmi%iatp(ip) /= 0) cycle
230  do i = 1, this%fmi%gwfpackages(ip)%nbound
231  node = this%fmi%gwfpackages(ip)%nodelist(i)
232  if (node > 0) then
233  this%nbound = this%nbound + 1
234  end if
235  end do
236  end do
237  !
238  ! -- Call the ad method on any ssm input files so that values for
239  ! time-series are interpolated
240  do ip = 1, this%fmi%nflowpack
241  if (this%fmi%iatp(ip) /= 0) cycle
242  if (this%isrctype(ip) == 3 .or. this%isrctype(ip) == 4) then
243  ssmiptr => this%ssmivec(ip)
244  call ssmiptr%spc_ad(this%fmi%gwfpackages(ip)%nbound, &
245  this%fmi%gwfpackages(ip)%budtxt)
246  end if
247  end do
248  end subroutine ssm_ad
249 
250  !> @ brief Calculate the SSM mass flow rate and hcof and rhs values
251  !!
252  !! This is the primary SSM routine that calculates the matrix coefficient
253  !! and right-hand-side value for any package and package entry. It returns
254  !! several different optional variables that are used throughout this
255  !! package to update matrix terms, budget calculations, and output tables.
256  !<
257  subroutine ssm_term(this, ipackage, ientry, rrate, rhsval, hcofval, &
258  cssm, qssm)
259  ! -- dummy
260  class(tspssmtype) :: this !< TspSsmType
261  integer(I4B), intent(in) :: ipackage !< package number
262  integer(I4B), intent(in) :: ientry !< bound number
263  real(DP), intent(out), optional :: rrate !< calculated mass flow rate
264  real(DP), intent(out), optional :: rhsval !< calculated rhs value
265  real(DP), intent(out), optional :: hcofval !< calculated hcof value
266  real(DP), intent(out), optional :: cssm !< calculated source concentration/temperature depending on flow direction
267  real(DP), intent(out), optional :: qssm !< water flow rate into model cell from boundary package
268  ! -- local
269  logical(LGP) :: lauxmixed
270  integer(I4B) :: n
271  integer(I4B) :: nbound_flow
272  real(DP) :: qbnd
273  real(DP) :: ctmp
274  real(DP) :: omega
275  real(DP) :: hcoftmp
276  real(DP) :: rhstmp
277  !
278  ! -- retrieve node number, qbnd and iauxpos
279  hcoftmp = dzero
280  rhstmp = dzero
281  ctmp = dzero
282  qbnd = dzero
283  nbound_flow = this%fmi%gwfpackages(ipackage)%nbound
284  n = this%fmi%gwfpackages(ipackage)%nodelist(ientry)
285  !
286  ! -- If cell is active (ibound > 0) then calculate values
287  if (this%ibound(n) > 0) then
288  !
289  ! -- retrieve qbnd and iauxpos
290  qbnd = this%fmi%gwfpackages(ipackage)%get_flow(ientry)
291  call this%get_ssm_conc(ipackage, ientry, nbound_flow, ctmp, lauxmixed)
292  !
293  ! -- assign values for hcoftmp, rhstmp, and ctmp for subsequent assignment
294  ! of hcof, rhs, and rate
295  if (.not. lauxmixed) then
296  !
297  ! -- If qbnd is positive, then concentration (or temperature) represents
298  ! the inflow concentration (or temperature). If qbnd is negative,
299  ! then the outflow concentration (or temperature) is set equal to the
300  ! simulated cell's concentration (or temperature).
301  if (qbnd >= dzero) then
302  omega = dzero ! rhs
303  else
304  ctmp = this%cnew(n)
305  omega = done ! lhs
306  if (ctmp < dzero) then
307  omega = dzero ! concentration/temperature is negative, so set mass flux to zero
308  end if
309  end if
310  else
311  !
312  ! -- lauxmixed value indicates that this is a mixed sink type where
313  ! the concentration (or temperature) value represents the injected
314  ! concentration (or temperature) if qbnd is positive. If qbnd is
315  ! negative, then the withdrawn water is equal to the minimum of the
316  ! aux concentration (or temperature) and the cell concentration
317  ! (or temperature).
318  if (qbnd >= dzero) then
319  omega = dzero ! rhs (ctmp is aux value)
320  else
321  if (ctmp < this%cnew(n)) then
322  omega = dzero ! rhs (ctmp is aux value)
323  else
324  omega = done ! lhs (ctmp is cell concentration)
325  ctmp = this%cnew(n)
326  end if
327  end if
328  end if
329  !
330  ! -- Add terms based on qbnd sign
331  if (qbnd <= dzero) then
332  hcoftmp = qbnd * omega * this%eqnsclfac
333  else
334  rhstmp = -qbnd * ctmp * (done - omega) * this%eqnsclfac
335  end if
336  !
337  ! -- end of active ibound
338  end if
339  !
340  ! -- set requested values
341  if (present(hcofval)) hcofval = hcoftmp
342  if (present(rhsval)) rhsval = rhstmp
343  if (present(rrate)) rrate = hcoftmp * ctmp - rhstmp
344  if (present(cssm)) cssm = ctmp
345  if (present(qssm)) qssm = qbnd
346  end subroutine ssm_term
347 
348  !> @ brief Provide bound concentration (or temperature) and mixed flag
349  !!
350  !! SSM concentrations and temperatures can be provided in auxiliary variables
351  !! or through separate SPC files. If not provided, the default
352  !! concentration (or temperature) is zero. This single routine provides
353  !! the SSM bound concentration (or temperature) based on these different
354  !! approaches. The mixed flag indicates whether or not the boundary as a
355  !! mixed type.
356  !<
357  subroutine get_ssm_conc(this, ipackage, ientry, nbound_flow, conc, &
358  lauxmixed)
359  ! -- dummy
360  class(tspssmtype) :: this !< TspSsmType
361  integer(I4B), intent(in) :: ipackage !< package number
362  integer(I4B), intent(in) :: ientry !< bound number
363  integer(I4B), intent(in) :: nbound_flow !< size of flow package bound list
364  real(DP), intent(out) :: conc !< user-specified concentration/temperature for this bound
365  logical(LGP), intent(out) :: lauxmixed !< user-specified flag for marking this as a mixed boundary
366  ! -- local
367  integer(I4B) :: isrctype
368  integer(I4B) :: iauxpos
369  !
370  conc = dzero
371  lauxmixed = .false.
372  isrctype = this%isrctype(ipackage)
373  !
374  select case (isrctype)
375  case (1, 2)
376  iauxpos = this%iauxpak(ipackage)
377  conc = this%fmi%gwfpackages(ipackage)%auxvar(iauxpos, ientry)
378  if (isrctype == 2) lauxmixed = .true.
379  case (3, 4)
380  conc = this%ssmivec(ipackage)%get_value(ientry, nbound_flow)
381  if (isrctype == 4) lauxmixed = .true.
382  end select
383  end subroutine get_ssm_conc
384 
385  !> @ brief Fill coefficients
386  !!
387  !! This routine adds the effects of the SSM to the matrix equations by
388  !! updating the a matrix and right-hand side vector.
389  !<
390  subroutine ssm_fc(this, matrix_sln, idxglo, rhs)
391  ! -- dummy
392  class(tspssmtype) :: this
393  class(matrixbasetype), pointer :: matrix_sln
394  integer(I4B), intent(in), dimension(:) :: idxglo
395  real(DP), intent(inout), dimension(:) :: rhs
396  ! -- local
397  integer(I4B) :: ip
398  integer(I4B) :: i
399  integer(I4B) :: n
400  integer(I4B) :: idiag
401  integer(I4B) :: nflowpack
402  integer(I4B) :: nbound
403  real(DP) :: hcofval
404  real(DP) :: rhsval
405  !
406  ! -- do for each flow package
407  nflowpack = this%fmi%nflowpack
408  do ip = 1, nflowpack
409  if (this%fmi%iatp(ip) /= 0) cycle
410  !
411  ! -- do for each entry in package (ip)
412  nbound = this%fmi%gwfpackages(ip)%nbound
413  do i = 1, nbound
414  n = this%fmi%gwfpackages(ip)%nodelist(i)
415  if (n <= 0) cycle
416  call this%ssm_term(ip, i, rhsval=rhsval, hcofval=hcofval)
417  idiag = idxglo(this%dis%con%ia(n))
418  call matrix_sln%add_value_pos(idiag, hcofval)
419  rhs(n) = rhs(n) + rhsval
420  !
421  end do
422  !
423  end do
424  end subroutine ssm_fc
425 
426  !> @ brief Calculate flow
427  !!
428  !! Calculate the resulting mass flow between the boundary and the connected
429  !! GWT/GWE model cell. Update the diagonal position of the flowja array so
430  !! that it ultimately contains the solute balance residual.
431  !<
432  subroutine ssm_cq(this, flowja)
433  ! -- dummy
434  class(tspssmtype) :: this !< TspSsmType object
435  real(DP), dimension(:), contiguous, intent(inout) :: flowja !< flow across each face in the model grid
436  ! -- local
437  integer(I4B) :: ip
438  integer(I4B) :: i
439  integer(I4B) :: n
440  integer(I4B) :: idiag
441  real(DP) :: rate
442  !
443  ! -- do for each flow package
444  do ip = 1, this%fmi%nflowpack
445  !
446  ! -- cycle if package is being managed as an advanced package
447  if (this%fmi%iatp(ip) /= 0) cycle
448  !
449  ! -- do for each boundary
450  do i = 1, this%fmi%gwfpackages(ip)%nbound
451  n = this%fmi%gwfpackages(ip)%nodelist(i)
452  if (n <= 0) cycle
453  call this%ssm_term(ip, i, rrate=rate)
454  idiag = this%dis%con%ia(n)
455  flowja(idiag) = flowja(idiag) + rate
456  !
457  end do
458  !
459  end do
460  end subroutine ssm_cq
461 
462  !> @ brief Calculate the global SSM budget terms
463  !!
464  !! Calculate the global SSM budget terms using separate in and out entries
465  !! for each flow package.
466  !<
467  subroutine ssm_bd(this, isuppress_output, model_budget)
468  ! -- modules
469  use tdismodule, only: delt
470  use budgetmodule, only: budgettype
471  ! -- dummy
472  class(tspssmtype) :: this !< TspSsmType object
473  integer(I4B), intent(in) :: isuppress_output !< flag to suppress output
474  type(budgettype), intent(inout) :: model_budget !< budget object for the GWT model
475  ! -- local
476  character(len=LENBUDROWLABEL) :: rowlabel
477  integer(I4B) :: ip
478  integer(I4B) :: i
479  integer(I4B) :: n
480  real(DP) :: rate
481  real(DP) :: rin
482  real(DP) :: rout
483  !
484  ! -- do for each flow package, unless it is being handled by an advanced
485  ! transport package
486  do ip = 1, this%fmi%nflowpack
487  !
488  ! -- cycle if package is being managed as an advanced package
489  if (this%fmi%iatp(ip) /= 0) cycle
490  !
491  ! -- Initialize the rate accumulators
492  rin = dzero
493  rout = dzero
494  !
495  ! -- do for each boundary
496  do i = 1, this%fmi%gwfpackages(ip)%nbound
497  n = this%fmi%gwfpackages(ip)%nodelist(i)
498  if (n <= 0) cycle
499  call this%ssm_term(ip, i, rrate=rate)
500  if (rate < dzero) then
501  rout = rout - rate
502  else
503  rin = rin + rate
504  end if
505  !
506  end do
507  !
508  rowlabel = 'SSM_'//adjustl(trim(this%fmi%flowpacknamearray(ip)))
509  call model_budget%addentry(rin, rout, delt, &
510  this%fmi%gwfpackages(ip)%budtxt, &
511  isuppress_output, rowlabel=rowlabel)
512  end do
513  end subroutine ssm_bd
514 
515  !> @ brief Output flows
516  !!
517  !! Based on user-specified controls, print SSM mass flow rates to the GWT
518  !! listing file and/or write the SSM mass flow rates to the GWT binary
519  !! budget file.
520  !<
521  subroutine ssm_ot_flow(this, icbcfl, ibudfl, icbcun)
522  ! -- modules
523  use tdismodule, only: kstp, kper
525  ! -- dummy
526  class(tspssmtype) :: this !< TspSsmType object
527  integer(I4B), intent(in) :: icbcfl !< flag for writing binary budget terms
528  integer(I4B), intent(in) :: ibudfl !< flag for printing budget terms to list file
529  integer(I4B), intent(in) :: icbcun !< fortran unit number for binary budget file
530  ! -- local
531  character(len=LINELENGTH) :: title
532  integer(I4B) :: node, nodeu
533  character(len=20) :: nodestr
534  integer(I4B) :: maxrows
535  integer(I4B) :: ip
536  integer(I4B) :: i, n2, ibinun
537  real(DP) :: rrate
538  real(DP) :: qssm
539  real(DP) :: cssm
540  integer(I4B) :: naux
541  real(DP), dimension(0) :: auxrow
542  character(len=LENAUXNAME), dimension(0) :: auxname
543  ! -- for observations
544  character(len=LENBOUNDNAME) :: bname
545  ! -- formats
546  character(len=*), parameter :: fmttkk = &
547  &"(1X,/1X,A,' PERIOD ',I0,' STEP ',I0)"
548  !
549  ! -- initialize
550  naux = 0
551  maxrows = 0
552  if (ibudfl /= 0 .and. this%iprflow /= 0) then
553  call this%outputtab%set_kstpkper(kstp, kper)
554  do ip = 1, this%fmi%nflowpack
555  if (this%fmi%iatp(ip) /= 0) cycle
556  !
557  ! -- do for each boundary
558  do i = 1, this%fmi%gwfpackages(ip)%nbound
559  node = this%fmi%gwfpackages(ip)%nodelist(i)
560  if (node > 0) then
561  maxrows = maxrows + 1
562  end if
563  end do
564  end do
565  if (maxrows > 0) then
566  call this%outputtab%set_maxbound(maxrows)
567  end if
568  title = 'SSM PACKAGE ('//trim(this%packName)// &
569  ') FLOW RATES'
570  call this%outputtab%set_title(title)
571  end if
572  !
573  ! -- Set unit number for binary output
574  if (this%ipakcb < 0) then
575  ibinun = icbcun
576  else if (this%ipakcb == 0) then
577  ibinun = 0
578  else
579  ibinun = this%ipakcb
580  end if
581  if (icbcfl == 0) ibinun = 0
582  !
583  ! -- If cell-by-cell flows will be saved as a list, write header.
584  if (ibinun /= 0) then
585  call this%dis%record_srcdst_list_header(text, this%name_model, &
586  this%name_model, this%name_model, &
587  this%packName, naux, auxname, &
588  ibinun, this%nbound, this%iout)
589  end if
590  !
591  ! -- If no boundaries, skip flow calculations.
592  if (this%nbound > 0) then
593  !
594  ! -- Loop through each boundary calculating flow.
595  do ip = 1, this%fmi%nflowpack
596  if (this%fmi%iatp(ip) /= 0) cycle
597  !
598  ! -- do for each boundary
599  do i = 1, this%fmi%gwfpackages(ip)%nbound
600  !
601  ! -- Calculate rate for this entry
602  node = this%fmi%gwfpackages(ip)%nodelist(i)
603  if (node <= 0) cycle
604  call this%ssm_term(ip, i, rrate=rrate, qssm=qssm, cssm=cssm)
605  !
606  ! -- Print the individual rates if the budget is being printed
607  ! and PRINT_FLOWS was specified (this%iprflow<0)
608  if (ibudfl /= 0) then
609  if (this%iprflow /= 0) then
610  !
611  ! -- set nodestr and write outputtab table
612  nodeu = this%dis%get_nodeuser(node)
613  call this%dis%nodeu_to_string(nodeu, nodestr)
614  bname = this%fmi%gwfpackages(ip)%name
615  call this%outputtab%add_term(i)
616  call this%outputtab%add_term(trim(adjustl(nodestr)))
617  call this%outputtab%add_term(qssm)
618  call this%outputtab%add_term(cssm)
619  call this%outputtab%add_term(rrate)
620  call this%outputtab%add_term(bname)
621  end if
622  end if
623  !
624  ! -- If saving cell-by-cell flows in list, write flow
625  if (ibinun /= 0) then
626  n2 = i
627  call this%dis%record_mf6_list_entry(ibinun, node, n2, rrate, &
628  naux, auxrow, &
629  olconv2=.false.)
630  end if
631  !
632  end do
633  !
634  end do
635  end if
636  if (ibudfl /= 0) then
637  if (this%iprflow /= 0) then
638  write (this%iout, '(1x)')
639  end if
640  end if
641  end subroutine ssm_ot_flow
642 
643  !> @ brief Deallocate
644  !!
645  !! Deallocate the memory associated with this derived type
646  !<
647  subroutine ssm_da(this)
648  ! -- modules
650  ! -- dummy
651  class(tspssmtype) :: this !< TspSsmType object
652  ! -- local
653  integer(I4B) :: ip
654  type(tspspctype), pointer :: ssmiptr
655  !
656  ! -- Deallocate the ssmi objects if package was active
657  if (this%inunit > 0) then
658  do ip = 1, size(this%ssmivec)
659  if (this%isrctype(ip) == 3 .or. this%isrctype(ip) == 4) then
660  ssmiptr => this%ssmivec(ip)
661  call ssmiptr%spc_da()
662  end if
663  end do
664  deallocate (this%ssmivec)
665  end if
666  !
667  ! -- Deallocate arrays if package was active
668  if (this%inunit > 0) then
669  call mem_deallocate(this%iauxpak)
670  call mem_deallocate(this%isrctype)
671  this%ibound => null()
672  this%fmi => null()
673  end if
674  !
675  ! -- output table object
676  if (associated(this%outputtab)) then
677  call this%outputtab%table_da()
678  deallocate (this%outputtab)
679  nullify (this%outputtab)
680  end if
681  !
682  ! -- Scalars
683  call mem_deallocate(this%nbound)
684  !
685  ! -- deallocate parent
686  call this%NumericalPackageType%da()
687  end subroutine ssm_da
688 
689  !> @ brief Allocate scalars
690  !!
691  !! Allocate scalar variables for this derived type
692  !<
693  subroutine allocate_scalars(this)
694  ! -- modules
696  ! -- dummy
697  class(tspssmtype) :: this !< TspSsmType object
698  !
699  ! -- allocate scalars in NumericalPackageType
700  call this%NumericalPackageType%allocate_scalars()
701  !
702  ! -- Allocate
703  call mem_allocate(this%nbound, 'NBOUND', this%memoryPath)
704  !
705  ! -- Initialize
706  this%nbound = 0
707  end subroutine allocate_scalars
708 
709  !> @ brief Allocate arrays
710  !!
711  !! Allocate array variables for this derived type
712  !<
713  subroutine allocate_arrays(this)
714  ! -- modules
716  ! -- dummy
717  class(tspssmtype) :: this !< TspSsmType object
718  ! -- local
719  integer(I4B) :: nflowpack
720  integer(I4B) :: i
721  !
722  ! -- Allocate
723  nflowpack = this%fmi%nflowpack
724  call mem_allocate(this%iauxpak, nflowpack, 'IAUXPAK', this%memoryPath)
725  call mem_allocate(this%isrctype, nflowpack, 'ISRCTYPE', this%memoryPath)
726  !
727  ! -- Initialize
728  do i = 1, nflowpack
729  this%iauxpak(i) = 0
730  this%isrctype(i) = 0
731  end do
732  !
733  ! -- Allocate the ssmivec array
734  allocate (this%ssmivec(nflowpack))
735  end subroutine allocate_arrays
736 
737  !> @ brief Read package options
738  !!
739  !! Read and set the SSM Package options
740  !<
741  subroutine read_options(this)
742  ! -- dummy
743  class(tspssmtype) :: this !< TspSsmType object
744  ! -- local
745  character(len=LINELENGTH) :: keyword
746  integer(I4B) :: ierr
747  logical :: isfound, endOfBlock
748  ! -- formats
749  character(len=*), parameter :: fmtiprflow = &
750  "(4x,'SSM FLOW INFORMATION WILL BE PRINTED TO LISTING FILE &
751  &WHENEVER ICBCFL IS NOT ZERO.')"
752  character(len=*), parameter :: fmtisvflow = &
753  "(4x,'CELL-BY-CELL FLOW INFORMATION WILL BE SAVED TO BINARY FILE &
754  &WHENEVER ICBCFL IS NOT ZERO.')"
755  !
756  ! -- get options block
757  call this%parser%GetBlock('OPTIONS', isfound, ierr, blockrequired=.false., &
758  supportopenclose=.true.)
759  !
760  ! -- parse options block if detected
761  if (isfound) then
762  write (this%iout, '(1x,a)') 'PROCESSING SSM OPTIONS'
763  do
764  call this%parser%GetNextLine(endofblock)
765  if (endofblock) exit
766  call this%parser%GetStringCaps(keyword)
767  select case (keyword)
768  case ('PRINT_FLOWS')
769  this%iprflow = 1
770  write (this%iout, fmtiprflow)
771  case ('SAVE_FLOWS')
772  this%ipakcb = -1
773  write (this%iout, fmtisvflow)
774  case default
775  write (errmsg, '(a,a)') 'Unknown SSM option: ', trim(keyword)
776  call store_error(errmsg)
777  call this%parser%StoreErrorUnit()
778  end select
779  end do
780  write (this%iout, '(1x,a)') 'END OF SSM OPTIONS'
781  end if
782  end subroutine read_options
783 
784  !> @ brief Read package data
785  !!
786  !! Read and set the SSM Package data
787  !<
788  subroutine read_data(this)
789  ! -- dummy
790  class(tspssmtype) :: this !< TspSsmType object
791  !
792  ! -- read and process required SOURCES block
793  call this%read_sources_aux()
794  !
795  ! -- read and process optional FILEINPUT block
796  call this%read_sources_fileinput()
797  end subroutine read_data
798 
799  !> @ brief Read SOURCES block
800  !!
801  !! Read SOURCES block and look for auxiliary columns in
802  !! corresponding flow data.
803  !<
804  subroutine read_sources_aux(this)
805  ! -- dummy
806  class(tspssmtype) :: this !< TspSsmType object
807  ! -- local
808  character(len=LINELENGTH) :: keyword
809  character(len=20) :: srctype
810  integer(I4B) :: ierr
811  integer(I4B) :: ip
812  integer(I4B) :: nflowpack
813  integer(I4B) :: isrctype
814  logical :: isfound, endOfBlock
815  logical :: pakfound
816  logical :: lauxmixed
817  !
818  ! -- initialize
819  isfound = .false.
820  lauxmixed = .false.
821  nflowpack = this%fmi%nflowpack
822  !
823  ! -- get sources block
824  call this%parser%GetBlock('SOURCES', isfound, ierr, &
825  supportopenclose=.true., &
826  blockrequired=.true.)
827  if (isfound) then
828  write (this%iout, '(1x,a)') 'PROCESSING SOURCES'
829  do
830  call this%parser%GetNextLine(endofblock)
831  if (endofblock) exit
832  !
833  ! -- read package name and make sure it can be found
834  call this%parser%GetStringCaps(keyword)
835  pakfound = .false.
836  do ip = 1, nflowpack
837  if (trim(adjustl(this%fmi%gwfpackages(ip)%name)) == keyword) then
838  pakfound = .true.
839  exit
840  end if
841  end do
842  if (.not. pakfound) then
843  write (errmsg, '(a,a)') 'Flow package cannot be found: ', &
844  trim(keyword)
845  call store_error(errmsg)
846  call this%parser%StoreErrorUnit()
847  end if
848  !
849  ! -- Ensure package was not specified more than once in SOURCES block
850  if (this%isrctype(ip) /= 0) then
851  write (errmsg, '(a, a)') &
852  'A package cannot be specified more than once in the SSM SOURCES &
853  &block. The following package was specified more than once: ', &
854  trim(keyword)
855  call store_error(errmsg)
856  call this%parser%StoreErrorUnit()
857  end if
858  !
859  ! -- read the source type
860  call this%parser%GetStringCaps(srctype)
861  select case (srctype)
862  case ('AUX')
863  write (this%iout, '(1x,a)') 'AUX SOURCE DETECTED.'
864  isrctype = 1
865  case ('AUXMIXED')
866  write (this%iout, '(1x,a)') 'AUXMIXED SOURCE DETECTED.'
867  lauxmixed = .true.
868  isrctype = 2
869  case default
870  write (errmsg, '(a, a)') &
871  'SRCTYPE must be AUX or AUXMIXED. Found: ', trim(srctype)
872  call store_error(errmsg)
873  call this%parser%StoreErrorUnit()
874  end select
875  !
876  ! -- Store the source type (1 or 2)
877  this%isrctype(ip) = isrctype
878  !
879  ! -- Find and store the auxiliary column
880  call this%set_iauxpak(ip, trim(keyword))
881 
882  end do
883  write (this%iout, '(1x,a)') 'END PROCESSING SOURCES'
884  else
885  write (errmsg, '(a)') 'Required SOURCES block not found.'
886  call store_error(errmsg)
887  call this%parser%StoreErrorUnit()
888  end if
889  !
890  ! -- terminate if errors
891  if (count_errors() > 0) then
892  call this%parser%StoreErrorUnit()
893  end if
894  end subroutine read_sources_aux
895 
896  !> @ brief Read FILEINPUT block
897  !!
898  !! Read optional FILEINPUT block and initialize an
899  !! SPC input file reader for each entry.
900  !<
901  subroutine read_sources_fileinput(this)
902  ! -- dummy
903  class(tspssmtype) :: this !< TspSsmType object
904  ! -- local
905  character(len=LINELENGTH) :: keyword
906  character(len=LINELENGTH) :: keyword2
907  character(len=20) :: srctype
908  integer(I4B) :: ierr
909  integer(I4B) :: ip
910  integer(I4B) :: nflowpack
911  integer(I4B) :: isrctype
912  logical :: isfound, endOfBlock
913  logical :: pakfound
914  logical :: lauxmixed
915  !
916  ! -- initialize
917  isfound = .false.
918  lauxmixed = .false.
919  nflowpack = this%fmi%nflowpack
920  !
921  ! -- get sources_file block
922  call this%parser%GetBlock('FILEINPUT', isfound, ierr, &
923  supportopenclose=.true., &
924  blockrequired=.false.)
925  if (isfound) then
926  write (this%iout, '(1x,a)') 'PROCESSING FILEINPUT'
927  do
928  call this%parser%GetNextLine(endofblock)
929  if (endofblock) exit
930  !
931  ! -- read package name and make sure it can be found
932  call this%parser%GetStringCaps(keyword)
933  pakfound = .false.
934  do ip = 1, nflowpack
935  if (trim(adjustl(this%fmi%gwfpackages(ip)%name)) == keyword) then
936  pakfound = .true.
937  exit
938  end if
939  end do
940  if (.not. pakfound) then
941  write (errmsg, '(a,a)') 'Flow package cannot be found: ', &
942  trim(keyword)
943  call store_error(errmsg)
944  call this%parser%StoreErrorUnit()
945  end if
946  !
947  ! -- Ensure package was not specified more than once in SOURCES block
948  if (this%isrctype(ip) /= 0) then
949  write (errmsg, '(a, a)') &
950  'A package cannot be specified more than once in the SSM SOURCES &
951  &and SOURCES_FILES blocks. The following package was specified &
952  &more than once: ', &
953  trim(keyword)
954  call store_error(errmsg)
955  call this%parser%StoreErrorUnit()
956  end if
957  !
958  ! -- read the source type
959  call this%parser%GetStringCaps(srctype)
960  select case (srctype)
961  case ('SPC6')
962  write (this%iout, '(1x,a)') 'SPC6 SOURCE DETECTED.'
963  isrctype = 3
964  !
965  ! verify filein is next
966  call this%parser%GetStringCaps(keyword2)
967  if (trim(adjustl(keyword2)) /= 'FILEIN') then
968  errmsg = 'SPC6 keyword must be followed by "FILEIN" '// &
969  'then by filename and optionally by <MIXED>.'
970  call store_error(errmsg)
971  call this%parser%StoreErrorUnit()
972  end if
973  !
974  ! -- Use set_ssmivec to read file name and set up
975  ! ssmi file object
976  call this%set_ssmivec(ip, trim(keyword))
977  !
978  ! -- check for optional MIXED keyword and set isrctype to 4 if found
979  call this%parser%GetStringCaps(keyword2)
980  if (trim(keyword2) == 'MIXED') then
981  isrctype = 4
982  write (this%iout, '(1x,a,a)') 'ASSIGNED MIXED SSM TYPE TO PACKAGE ', &
983  trim(keyword)
984  end if
985  case default
986  write (errmsg, '(a,a)') &
987  'SRCTYPE must be SPC6. Found: ', trim(srctype)
988  call store_error(errmsg)
989  call this%parser%StoreErrorUnit()
990  end select
991  !
992  ! -- Store the source type (3 or 4)
993  this%isrctype(ip) = isrctype
994  !
995  end do
996  write (this%iout, '(1x,a)') 'END PROCESSING FILEINPUT'
997  else
998  write (this%iout, '(1x,a)') &
999  'OPTIONAL FILEINPUT BLOCK NOT FOUND. CONTINUING.'
1000  end if
1001  !
1002  ! -- terminate if errors
1003  if (count_errors() > 0) then
1004  call this%parser%StoreErrorUnit()
1005  end if
1006  end subroutine read_sources_fileinput
1007 
1008  !> @ brief Set iauxpak array value for package ip
1009  !!
1010  !! The next call to parser will return the auxiliary name for
1011  !! package ip in the SSM SOURCES block. The routine searches
1012  !! through the auxiliary names in package ip and sets iauxpak
1013  !! to the column number corresponding to the correct auxiliary
1014  !! column.
1015  !<
1016  subroutine set_iauxpak(this, ip, packname)
1017  ! -- dummy
1018  class(tspssmtype), intent(inout) :: this !< TspSsmType
1019  integer(I4B), intent(in) :: ip !< package number
1020  character(len=*), intent(in) :: packname !< name of package
1021  ! -- local
1022  character(len=LENAUXNAME) :: auxname
1023  logical :: auxfound
1024  integer(I4B) :: iaux
1025  !
1026  ! -- read name of auxiliary column
1027  call this%parser%GetStringCaps(auxname)
1028  auxfound = .false.
1029  do iaux = 1, this%fmi%gwfpackages(ip)%naux
1030  if (trim(this%fmi%gwfpackages(ip)%auxname(iaux)) == &
1031  trim(auxname)) then
1032  auxfound = .true.
1033  exit
1034  end if
1035  end do
1036  if (.not. auxfound) then
1037  write (errmsg, '(a, a)') &
1038  'Auxiliary name cannot be found: ', trim(auxname)
1039  call store_error(errmsg)
1040  call this%parser%StoreErrorUnit()
1041  end if
1042  !
1043  ! -- set iauxpak and write message
1044  this%iauxpak(ip) = iaux
1045  write (this%iout, '(4x, a, i0, a, a)') 'USING AUX COLUMN ', &
1046  iaux, ' IN PACKAGE ', trim(packname)
1047  end subroutine set_iauxpak
1048 
1049  !> @ brief Set ssmivec array value for package ip
1050  !!
1051  !! The next call to parser will return the input file name for
1052  !! package ip in the SSM SOURCES block. The routine then
1053  !! initializes the SPC input file.
1054  !<
1055  subroutine set_ssmivec(this, ip, packname)
1056  ! -- module
1057  use inputoutputmodule, only: openfile, getunit
1058  ! -- dummy
1059  class(tspssmtype), intent(inout) :: this !< TspSsmType
1060  integer(I4B), intent(in) :: ip !< package number
1061  character(len=*), intent(in) :: packname !< name of package
1062  ! -- local
1063  character(len=LINELENGTH) :: filename
1064  type(tspspctype), pointer :: ssmiptr
1065  integer(I4B) :: inunit
1066  !
1067  ! -- read file name
1068  call this%parser%GetString(filename)
1069  inunit = getunit()
1070  call openfile(inunit, this%iout, filename, 'SPC', filstat_opt='OLD')
1071  !
1072  ! -- Create the SPC file object
1073  ssmiptr => this%ssmivec(ip)
1074  call ssmiptr%initialize(this%dis, ip, inunit, this%iout, this%name_model, &
1075  trim(packname), this%depvartype)
1076  !
1077  write (this%iout, '(4x, a, a, a, a, a)') 'USING SPC INPUT FILE ', &
1078  trim(filename), ' TO SET ', trim(this%depvartype), &
1079  'S FOR PACKAGE ', trim(packname)
1080  end subroutine set_ssmivec
1081 
1082  !> @ brief Setup the output table
1083  !!
1084  !! Setup the output table by creating the column headers.
1085  !<
1086  subroutine pak_setup_outputtab(this)
1087  ! -- dummy
1088  class(tspssmtype), intent(inout) :: this
1089  ! -- local
1090  character(len=LINELENGTH) :: title
1091  character(len=LINELENGTH) :: text
1092  integer(I4B) :: ntabcol
1093  !
1094  ! -- allocate and initialize the output table
1095  if (this%iprflow /= 0) then
1096  !
1097  ! -- dimension table
1098  ntabcol = 6
1099  !if (this%inamedbound > 0) then
1100  ! ntabcol = ntabcol + 1
1101  !end if
1102  !
1103  ! -- initialize the output table object
1104  title = 'SSM PACKAGE ('//trim(this%packName)// &
1105  ') FLOW RATES'
1106  call table_cr(this%outputtab, this%packName, title)
1107  call this%outputtab%table_df(1, ntabcol, this%iout, transient=.true.)
1108  text = 'NUMBER'
1109  call this%outputtab%initialize_column(text, 10, alignment=tabcenter)
1110  text = 'CELLID'
1111  call this%outputtab%initialize_column(text, 20, alignment=tableft)
1112  text = 'BOUND Q'
1113  call this%outputtab%initialize_column(text, 15, alignment=tabcenter)
1114  text = 'SSM CONC'
1115  call this%outputtab%initialize_column(text, 15, alignment=tabcenter)
1116  text = 'RATE'
1117  call this%outputtab%initialize_column(text, 15, alignment=tabcenter)
1118  text = 'PACKAGE NAME'
1119  call this%outputtab%initialize_column(text, 16, alignment=tabcenter)
1120  !if (this%inamedbound > 0) then
1121  ! text = 'NAME'
1122  ! call this%outputtab%initialize_column(text, 20, alignment=TABLEFT)
1123  !end if
1124  end if
1125  end subroutine pak_setup_outputtab
1126 
1127 end module tspssmmodule
This module contains the BudgetModule.
Definition: Budget.f90:20
This module contains simulation constants.
Definition: Constants.f90:9
integer(i4b), parameter linelength
maximum length of a standard line
Definition: Constants.f90:45
@ tabcenter
centered table column
Definition: Constants.f90:172
@ tableft
left justified table column
Definition: Constants.f90:171
integer(i4b), parameter lenpackagename
maximum length of the package name
Definition: Constants.f90:23
integer(i4b), parameter lenbudrowlabel
maximum length of the rowlabel string used in the budget table
Definition: Constants.f90:25
integer(i4b), parameter lenvarname
maximum length of a variable name
Definition: Constants.f90:17
integer(i4b), parameter lenftype
maximum length of a package type (DIS, WEL, OC, etc.)
Definition: Constants.f90:39
integer(i4b), parameter lenauxname
maximum length of a aux variable
Definition: Constants.f90:35
integer(i4b), parameter lenboundname
maximum length of a bound name
Definition: Constants.f90:36
real(dp), parameter dzero
real constant zero
Definition: Constants.f90:65
real(dp), parameter done
real constant 1
Definition: Constants.f90:76
integer(i4b) function, public getunit()
Get a free unit number.
subroutine, public openfile(iu, iout, fname, ftype, fmtarg_opt, accarg_opt, filstat_opt, mode_opt)
Open a file.
Definition: InputOutput.f90:30
This module defines variable data types.
Definition: kind.f90:8
This module contains the base numerical package type.
This module contains simulation methods.
Definition: Sim.f90:10
subroutine, public store_error(msg, terminate)
Store an error message.
Definition: Sim.f90:92
integer(i4b) function, public count_errors()
Return number of errors.
Definition: Sim.f90:59
subroutine, public store_error_unit(iunit, terminate)
Store the file unit number.
Definition: Sim.f90:168
This module contains simulation variables.
Definition: SimVariables.f90:9
character(len=maxcharlen) errmsg
error message string
subroutine, public table_cr(this, name, title)
Definition: Table.f90:87
integer(i4b), pointer, public kstp
current time step number
Definition: tdis.f90:24
integer(i4b), pointer, public kper
current stress period number
Definition: tdis.f90:23
real(dp), pointer, public delt
length of the current time step
Definition: tdis.f90:29
This module contains the TspSpc Module.
Definition: TspSpc.f90:7
This module contains the TspSsm Module.
Definition: tsp-ssm.f90:8
subroutine ssm_fc(this, matrix_sln, idxglo, rhs)
@ brief Fill coefficients
Definition: tsp-ssm.f90:391
subroutine ssm_ot_flow(this, icbcfl, ibudfl, icbcun)
@ brief Output flows
Definition: tsp-ssm.f90:522
subroutine ssm_term(this, ipackage, ientry, rrate, rhsval, hcofval, cssm, qssm)
@ brief Calculate the SSM mass flow rate and hcof and rhs values
Definition: tsp-ssm.f90:259
subroutine allocate_scalars(this)
@ brief Allocate scalars
Definition: tsp-ssm.f90:694
subroutine ssm_cq(this, flowja)
@ brief Calculate flow
Definition: tsp-ssm.f90:433
subroutine ssm_bd(this, isuppress_output, model_budget)
@ brief Calculate the global SSM budget terms
Definition: tsp-ssm.f90:468
subroutine pak_setup_outputtab(this)
@ brief Setup the output table
Definition: tsp-ssm.f90:1087
subroutine ssm_df(this)
@ brief Define SSM Package
Definition: tsp-ssm.f90:123
subroutine set_ssmivec(this, ip, packname)
@ brief Set ssmivec array value for package ip
Definition: tsp-ssm.f90:1056
subroutine set_iauxpak(this, ip, packname)
@ brief Set iauxpak array value for package ip
Definition: tsp-ssm.f90:1017
subroutine get_ssm_conc(this, ipackage, ientry, nbound_flow, conc, lauxmixed)
@ brief Provide bound concentration (or temperature) and mixed flag
Definition: tsp-ssm.f90:359
subroutine ssm_rp(this)
@ brief Read and prepare this SSM Package
Definition: tsp-ssm.f90:189
subroutine read_sources_fileinput(this)
@ brief Read FILEINPUT block
Definition: tsp-ssm.f90:902
character(len=lenpackagename) text
Definition: tsp-ssm.f90:29
subroutine ssm_ar(this, dis, ibound, cnew)
@ brief Allocate and read SSM Package
Definition: tsp-ssm.f90:135
subroutine read_sources_aux(this)
@ brief Read SOURCES block
Definition: tsp-ssm.f90:805
subroutine, public ssm_cr(ssmobj, name_model, inunit, iout, fmi, eqnsclfac, depvartype)
@ brief Create a new SSM package
Definition: tsp-ssm.f90:84
subroutine allocate_arrays(this)
@ brief Allocate arrays
Definition: tsp-ssm.f90:714
character(len=lenftype) ftype
Definition: tsp-ssm.f90:28
subroutine ssm_ad(this)
@ brief Advance the SSM Package
Definition: tsp-ssm.f90:216
subroutine read_options(this)
@ brief Read package options
Definition: tsp-ssm.f90:742
subroutine ssm_da(this)
@ brief Deallocate
Definition: tsp-ssm.f90:648
subroutine read_data(this)
@ brief Read package data
Definition: tsp-ssm.f90:789
Derived type for the Budget object.
Definition: Budget.f90:39
Data for sharing among multiple packages. Originally read in from.
Derived type for managing SPC input.
Definition: TspSpc.f90:39
Derived type for the SSM Package.
Definition: tsp-ssm.f90:37