MODFLOW 6  version 6.7.0.dev1
USGS Modular Hydrologic Model
All Classes Namespaces Files Functions Variables Enumerator Pages
BoundaryPackage.f90
Go to the documentation of this file.
1 !> @brief This module contains the base boundary package
2 !!
3 !! This module contains the base model boundary package class that is
4 !! extended by all model boundary packages. The base model boundary
5 !! package extends the NumericalPackageType.
6 !<
7 module bndmodule
8 
9  use kindmodule, only: dp, lgp, i4b
11  dzero, done, &
16  use simvariablesmodule, only: errmsg
17  use simmodule, only: count_errors, store_error, &
20  use obsmodule, only: obstype, obs_cr
21  use tdismodule, only: delt, totimc
22  use observemodule, only: observetype
27  use listmodule, only: listtype
29  use basedismodule, only: disbasetype
31  use tablemodule, only: tabletype, table_cr
34 
35  implicit none
36 
37  private
39  public :: save_print_model_flows
40  private :: castasbndclass
41 
42  !> @ brief BndType
43  !!
44  !! Generic boundary package type. This derived type can be overridden to
45  !! become concrete boundary package types.
46  !<
47  type, extends(numericalpackagetype) :: bndtype
48  ! -- characters
49  character(len=LENLISTLABEL), pointer :: listlabel => null() !< title of table written for RP
50  character(len=LENPACKAGENAME) :: text = '' !< text string for package flow term
51  character(len=LENAUXNAME), dimension(:), pointer, &
52  contiguous :: auxname => null() !< vector of auxname
53  type(characterstringtype), dimension(:), pointer, &
54  contiguous :: auxname_cst => null() !< copy of vector auxname that can be stored in memory manager
55  character(len=LENBOUNDNAME), dimension(:), pointer, &
56  contiguous :: boundname => null() !< vector of boundnames
57  type(characterstringtype), dimension(:), pointer, &
58  contiguous :: boundname_cst => null() !< copy of vector boundname that can be stored in memory manager
59  !
60  ! -- scalars
61  integer(I4B), pointer :: isadvpak => null() !< flag indicating package is advanced (1) or not (0)
62  integer(I4B), pointer :: ibcnum => null() !< consecutive package number for this boundary condition
63  integer(I4B), pointer :: maxbound => null() !< max number of boundaries
64  integer(I4B), pointer :: nbound => null() !< number of boundaries for current stress period
65  integer(I4B), pointer :: ncolbnd => null() !< number of columns of the bound array
66  integer(I4B), pointer :: iscloc => null() !< bound column to scale with SFAC
67  integer(I4B), pointer :: naux => null() !< number of auxiliary variables
68  integer(I4B), pointer :: inamedbound => null() !< flag to read boundnames
69  integer(I4B), pointer :: iauxmultcol => null() !< column to use as multiplier for column iscloc
70  integer(I4B), pointer :: npakeq => null() !< number of equations in this package (normally 0 unless package adds rows to matrix)
71  integer(I4B), pointer :: ioffset => null() !< offset of this package in the model
72  ! -- arrays
73  integer(I4B), dimension(:), pointer, contiguous :: nodelist => null() !< vector of reduced node numbers
74  integer(I4B), dimension(:), pointer, contiguous :: noupdateauxvar => null() !< override auxvars from being updated
75  real(dp), dimension(:, :), pointer, contiguous :: bound => null() !< array of package specific boundary numbers
76  real(dp), dimension(:), pointer, contiguous :: hcof => null() !< diagonal contribution
77  real(dp), dimension(:), pointer, contiguous :: rhs => null() !< right-hand side contribution
78  real(dp), dimension(:, :), pointer, contiguous :: auxvar => null() !< auxiliary variable array
79  real(dp), dimension(:), pointer, contiguous :: simvals => null() !< simulated values
80  real(dp), dimension(:), pointer, contiguous :: simtomvr => null() !< simulated to mover values
81  !
82  ! -- water mover flag and object
83  integer(I4B), pointer :: imover => null() !< flag indicating if the mover is active in the package
84  type(packagemovertype), pointer :: pakmvrobj => null() !< mover object for package
85  !
86  ! -- viscosity flag and safe-copy of conductance array
87  integer(I4B), pointer :: ivsc => null() !< flag indicating if viscosity is active in the model
88  real(dp), dimension(:), pointer, contiguous :: condinput => null() !< stores user-specified conductance values
89  !
90  ! -- timeseries
91  type(timeseriesmanagertype), pointer :: tsmanager => null() !< time series manager
92  type(timearrayseriesmanagertype), pointer :: tasmanager => null() !< time array series manager
93  integer(I4B) :: indxconvertflux = 0 !< indxconvertflux is column of bound to multiply by area to convert flux to rate
94  logical(LGP) :: allowtimearrayseries = .false.
95  !
96  ! -- pointers for observations
97  integer(I4B), pointer :: inobspkg => null() !< unit number for obs package
98  type(obstype), pointer :: obs => null() !< observation package
99  !
100  ! -- pointers to model/solution variables
101  integer(I4B), pointer :: neq !< number of equations for model
102  integer(I4B), dimension(:), pointer, contiguous :: ibound => null() !< model ibound array
103  real(dp), dimension(:), pointer, contiguous :: xnew => null() !< model dependent variable (head) for this time step
104  real(dp), dimension(:), pointer, contiguous :: xold => null() !< model dependent variable for last time step
105  real(dp), dimension(:), pointer, contiguous :: flowja => null() !< model intercell flows
106  integer(I4B), dimension(:), pointer, contiguous :: icelltype => null() !< pointer to icelltype array in NPF
107  character(len=LENMEMPATH) :: ictmempath = '' !< memory path to the icelltype data (for GWF this is in NPF)
108  !
109  ! -- table objects
110  type(tabletype), pointer :: inputtab => null() !< input table object
111  type(tabletype), pointer :: outputtab => null() !< output table object for package flows writtent to the model listing file
112  type(tabletype), pointer :: errortab => null() !< package error table
113 
114  contains
115  procedure, public :: bnd_df
116  procedure :: bnd_ac
117  procedure :: bnd_mc
118  procedure :: bnd_ar
119  procedure :: bnd_rp
120  procedure :: bnd_ad
121  procedure :: bnd_ck
122  procedure :: bnd_reset
123  procedure :: bnd_cf
124  procedure :: bnd_fc
125  procedure :: bnd_fn
126  procedure :: bnd_nur
127  procedure :: bnd_cc
128  procedure :: bnd_cq
129  procedure :: bnd_bd
130  procedure :: bnd_ot_model_flows
131  procedure :: bnd_ot_package_flows
132  procedure :: bnd_ot_dv
133  procedure :: bnd_ot_bdsummary
134  procedure :: bnd_da
135 
136  procedure :: allocate_scalars
137  procedure :: allocate_arrays
138  procedure :: pack_initialize
139  procedure :: read_options => bnd_read_options
140  procedure :: read_dimensions => bnd_read_dimensions
141  procedure :: read_initial_attr => bnd_read_initial_attr
142  procedure :: bnd_options
143  procedure :: bnd_cq_simrate
144  procedure :: bnd_cq_simtomvr
145  procedure :: set_pointers
146  procedure :: define_listlabel
147  procedure :: copy_boundname
148  procedure, private :: pak_setup_outputtab
149  !
150  ! -- procedures to support observations
151  procedure, public :: bnd_obs_supported
152  procedure, public :: bnd_df_obs
153  procedure, public :: bnd_bd_obs
154  procedure, public :: bnd_ot_obs
155  procedure, public :: bnd_rp_obs
156  !
157  ! -- procedure to support time series
158  procedure, public :: bnd_rp_ts
159  !
160  ! -- procedure to inform package that viscosity active
161  procedure, public :: bnd_activate_viscosity
162  !
163  ! -- procedure to backup user-specified conductance
164  procedure, private :: bnd_store_user_cond
165  !
166  end type bndtype
167 
168 contains
169 
170  !> @ brief Define boundary package options and dimensions
171  !!
172  !! Define base boundary package options and dimensions for
173  !! a model boundary package.
174  !<
175  subroutine bnd_df(this, neq, dis)
176  ! -- modules
179  ! -- dummy
180  class(bndtype), intent(inout) :: this !< BndType object
181  integer(I4B), intent(inout) :: neq !< number of equations
182  class(disbasetype), pointer :: dis !< discretization object
183  !
184  ! -- set pointer to dis object for the model
185  this%dis => dis
186  !
187  ! -- Create time series managers
188  call tsmanager_cr(this%TsManager, this%iout)
189  call tasmanager_cr(this%TasManager, dis, this%name_model, this%iout)
190  !
191  ! -- create obs package
192  call obs_cr(this%obs, this%inobspkg)
193  !
194  ! -- Write information to model list file
195  write (this%iout, 1) this%filtyp, trim(adjustl(this%text)), this%inunit
196 1 format(1x, /1x, a, ' -- ', a, ' PACKAGE, VERSION 8, 2/22/2014', &
197  ' INPUT READ FROM UNIT ', i0)
198  !
199  ! -- Initialize block parser
200  call this%parser%Initialize(this%inunit, this%iout)
201  !
202  ! -- set and read options
203  call this%read_options()
204  !
205  ! -- Now that time series will have been read, need to call the df
206  ! routine to define the manager
207  call this%tsmanager%tsmanager_df()
208  call this%tasmanager%tasmanager_df()
209  !
210  ! -- read the package dimensions block
211  call this%read_dimensions()
212  !
213  ! -- update package moffset for packages that add rows
214  if (this%npakeq > 0) then
215  this%ioffset = neq - this%dis%nodes
216  end if
217  !
218  ! -- update neq
219  neq = neq + this%npakeq
220  !
221  ! -- Store information needed for observations
222  if (this%bnd_obs_supported()) then
223  call this%obs%obs_df(this%iout, this%packName, this%filtyp, this%dis)
224  call this%bnd_df_obs()
225  end if
226  end subroutine bnd_df
227 
228  !> @ brief Add boundary package connection to matrix
229  !!
230  !! Add boundary package connection to the matrix for packages that add
231  !! connections to the coefficient matrix. An example would be the GWF model
232  !! MAW package. Base implementation that must be extended.
233  !<
234  subroutine bnd_ac(this, moffset, sparse)
235  ! -- modules
236  use sparsemodule, only: sparsematrix
237  use simmodule, only: store_error
238  ! -- dummy
239  class(bndtype), intent(inout) :: this !< BndType object
240  integer(I4B), intent(in) :: moffset !< solution matrix model offset
241  type(sparsematrix), intent(inout) :: sparse !< sparse object
242  end subroutine bnd_ac
243 
244  !> @ brief Map boundary package connection to matrix
245  !!
246  !! Map boundary package connection to the matrix for packages that add
247  !! connections to the coefficient matrix. An example would be the GWF model
248  !! MAW package. Base implementation that must be extended.
249  !<
250  subroutine bnd_mc(this, moffset, matrix_sln)
251  ! -- dummy
252  class(bndtype), intent(inout) :: this !< BndType object
253  integer(I4B), intent(in) :: moffset !< solution matrix model offset
254  class(matrixbasetype), pointer :: matrix_sln !< global system matrix
255  end subroutine bnd_mc
256 
257  !> @ brief Allocate and read method for boundary package
258  !!
259  !! Generic method to allocate and read static data for model boundary
260  !! packages. A boundary package only needs to override this method if
261  !! input data varies from the standard boundary package.
262  !<
263  subroutine bnd_ar(this)
264  ! -- modules
266  ! -- dummy
267  class(bndtype), intent(inout) :: this !< BndType object
268  !
269  ! -- allocate and read observations
270  call this%obs%obs_ar()
271  !
272  ! -- Allocate arrays in package superclass
273  call this%allocate_arrays()
274  !
275  ! -- read optional initial package parameters
276  call this%read_initial_attr()
277  !
278  ! -- setup pakmvrobj for standard stress packages
279  if (this%imover == 1) then
280  allocate (this%pakmvrobj)
281  call this%pakmvrobj%ar(this%maxbound, 0, this%memoryPath)
282  end if
283  end subroutine bnd_ar
284 
285  !> @ brief Allocate and read method for package
286  !!
287  !! Generic method to read and prepare period data for model boundary
288  !! packages. A boundary package only needs to override this method if
289  !! period data varies from the standard boundary package.
290  !<
291  subroutine bnd_rp(this)
292  ! -- modules
293  use tdismodule, only: kper, nper
294  ! -- dummy
295  class(bndtype), intent(inout) :: this !< BndType object
296  ! -- local
297  integer(I4B) :: ierr
298  integer(I4B) :: nlist
299  logical(LGP) :: isfound
300  character(len=LINELENGTH) :: line
301  ! -- formats
302  character(len=*), parameter :: fmtblkerr = &
303  &"('Looking for BEGIN PERIOD iper. Found ', a, ' instead.')"
304  character(len=*), parameter :: fmtlsp = &
305  &"(1X,/1X,'REUSING ',A,'S FROM LAST STRESS PERIOD')"
306  character(len=*), parameter :: fmtnbd = &
307  "(1X,/1X,'THE NUMBER OF ACTIVE ',A,'S (',I6, &
308  &') IS GREATER THAN MAXIMUM(',I6,')')"
309  !
310  ! -- Set ionper to the stress period number for which a new block of data
311  ! will be read.
312  if (this%inunit == 0) return
313  !
314  ! -- get stress period data
315  if (this%ionper < kper) then
316  !
317  ! -- get period block
318  call this%parser%GetBlock('PERIOD', isfound, ierr, &
319  supportopenclose=.true., &
320  blockrequired=.false.)
321  if (isfound) then
322  !
323  ! -- read ionper and check for increasing period numbers
324  call this%read_check_ionper()
325  else
326  !
327  ! -- PERIOD block not found
328  if (ierr < 0) then
329  ! -- End of file found; data applies for remainder of simulation.
330  this%ionper = nper + 1
331  else
332  ! -- Found invalid block
333  call this%parser%GetCurrentLine(line)
334  write (errmsg, fmtblkerr) adjustl(trim(line))
335  call store_error(errmsg)
336  call this%parser%StoreErrorUnit()
337  end if
338  end if
339  end if
340  !
341  ! -- read data if ionper == kper
342  if (this%ionper == kper) then
343  nlist = -1
344  ! -- Remove all time-series and time-array-series links associated with
345  ! this package.
346  call this%TsManager%Reset(this%packName)
347  call this%TasManager%Reset(this%packName)
348  !
349  ! -- Read data as a list
350  call this%dis%read_list(this%parser%line_reader, &
351  this%parser%iuactive, this%iout, &
352  this%iprpak, nlist, this%inamedbound, &
353  this%iauxmultcol, this%nodelist, &
354  this%bound, this%auxvar, this%auxname, &
355  this%boundname, this%listlabel, &
356  this%packName, this%tsManager, this%iscloc)
357  this%nbound = nlist
358  !
359  ! -- save user-specified conductance if vsc package is active
360  if (this%ivsc == 1) then
361  call this%bnd_store_user_cond(nlist, this%bound, this%condinput)
362  end if
363  !
364  ! Define the tsLink%Text value(s) appropriately.
365  ! E.g. for WEL package, entry 1, assign tsLink%Text = 'Q'
366  ! For RIV package, entry 1 text = 'STAGE', entry 2 text = 'COND',
367  ! entry 3 text = 'RBOT'; etc.
368  call this%bnd_rp_ts()
369  !
370  ! -- Terminate the block
371  call this%parser%terminateblock()
372  !
373  ! -- Copy boundname into boundname_cst
374  call this%copy_boundname()
375  !
376  else
377  write (this%iout, fmtlsp) trim(this%filtyp)
378  end if
379  end subroutine bnd_rp
380 
381  !> @ brief Advance the boundary package
382  !!
383  !! Advance data in the boundary package. The method sets advances
384  !! time series, time array series, and observation data. A boundary
385  !! package only needs to override this method if additional data
386  !! needs to be advanced.
387  !<
388  subroutine bnd_ad(this)
389  ! -- dummy
390  class(bndtype) :: this !< BndType object
391  ! -- local
392  real(DP) :: begintime, endtime
393  !
394  ! -- Initialize time variables
395  begintime = totimc
396  endtime = begintime + delt
397  !
398  ! -- Advance the time series managers
399  call this%TsManager%ad()
400  call this%TasManager%ad()
401  !
402  ! -- For each observation, push simulated value and corresponding
403  ! simulation time from "current" to "preceding" and reset
404  ! "current" value.
405  call this%obs%obs_ad()
406  end subroutine bnd_ad
407 
408  !> @ brief Check boundary package period data
409  !!
410  !! Check the boundary package period data. Base implementation that
411  !! must be extended by each model boundary package.
412  !<
413  subroutine bnd_ck(this)
414  ! -- dummy
415  class(bndtype), intent(inout) :: this !< BndType object
416  !
417  ! -- check stress period data
418  ! -- each package must override generic functionality
419  end subroutine bnd_ck
420 
421  !> @ brief Reset bnd package before formulating
422  !<
423  subroutine bnd_reset(this)
424  class(bndtype) :: this !< BndType object
425 
426  if (this%imover == 1) then
427  call this%pakmvrobj%reset()
428  end if
429 
430  end subroutine bnd_reset
431 
432  !> @ brief Formulate the package hcof and rhs terms.
433  !!
434  !! Formulate the hcof and rhs terms for the package that will be
435  !! added to the coefficient matrix and right-hand side vector.
436  !! Base implementation that must be extended by each model
437  !! boundary package.
438  !<
439  subroutine bnd_cf(this)
440  ! -- modules
441  class(bndtype) :: this !< BndType object
442  !
443  ! -- bnd has no cf routine
444  end subroutine bnd_cf
445 
446  !> @ brief Copy hcof and rhs terms into solution.
447  !!
448  !! Add the hcof and rhs terms for the boundary package to the
449  !! coefficient matrix and right-hand side vector. A boundary
450  !! package only needs to override this method if it is different for
451  !! a specific boundary package.
452  !<
453  subroutine bnd_fc(this, rhs, ia, idxglo, matrix_sln)
454  ! -- dummy
455  class(bndtype) :: this !< BndType object
456  real(DP), dimension(:), intent(inout) :: rhs !< right-hand side vector for model
457  integer(I4B), dimension(:), intent(in) :: ia !< solution CRS row pointers
458  integer(I4B), dimension(:), intent(in) :: idxglo !< mapping vector for model (local) to solution (global)
459  class(matrixbasetype), pointer :: matrix_sln !< solution coefficient matrix
460  ! -- local
461  integer(I4B) :: i
462  integer(I4B) :: n
463  integer(I4B) :: ipos
464  !
465  ! -- Copy package rhs and hcof into solution rhs and amat
466  do i = 1, this%nbound
467  n = this%nodelist(i)
468  rhs(n) = rhs(n) + this%rhs(i)
469  ipos = ia(n)
470  call matrix_sln%add_value_pos(idxglo(ipos), this%hcof(i))
471  end do
472  end subroutine bnd_fc
473 
474  !> @ brief Add Newton-Raphson terms for package into solution.
475  !!
476  !! Calculate and add the Newton-Raphson terms for the boundary package
477  !! to the coefficient matrix and right-hand side vector. A boundary
478  !! package only needs to override this method if a specific boundary
479  !! package needs to add Newton-Raphson terms.
480  !<
481  subroutine bnd_fn(this, rhs, ia, idxglo, matrix_sln)
482  ! -- dummy
483  class(bndtype) :: this !< BndType object
484  real(DP), dimension(:), intent(inout) :: rhs !< right-hand side vector for model
485  integer(I4B), dimension(:), intent(in) :: ia !< solution CRS row pointers
486  integer(I4B), dimension(:), intent(in) :: idxglo !< mapping vector for model (local) to solution (global)
487  class(matrixbasetype), pointer :: matrix_sln !< solution coefficient matrix
488  !
489  ! -- No addition terms for Newton-Raphson with constant conductance
490  ! boundary conditions
491  end subroutine bnd_fn
492 
493  !> @ brief Apply Newton-Raphson under-relaxation for package.
494  !!
495  !! Apply Newton-Raphson under-relaxation for a boundary package. A boundary
496  !! package only needs to override this method if a specific boundary
497  !! package needs to apply Newton-Raphson under-relaxation. An example is
498  !! the MAW package which adds rows to the system of equations and may need
499  !! to have the dependent-variable constrained by the bottom of the model.
500  !<
501  subroutine bnd_nur(this, neqpak, x, xtemp, dx, inewtonur, dxmax, locmax)
502  ! -- dummy
503  class(bndtype), intent(inout) :: this !< BndType object
504  integer(I4B), intent(in) :: neqpak !< number of equations in the package
505  real(DP), dimension(neqpak), intent(inout) :: x !< dependent variable
506  real(DP), dimension(neqpak), intent(in) :: xtemp !< previous dependent variable
507  real(DP), dimension(neqpak), intent(inout) :: dx !< change in dependent variable
508  integer(I4B), intent(inout) :: inewtonur !< flag indicating if newton-raphson under-relaxation should be applied
509  real(DP), intent(inout) :: dxmax !< maximum change in the dependent variable
510  integer(I4B), intent(inout) :: locmax !< location of the maximum change in the dependent variable
511  ! -- local
512  !
513  ! -- Newton-Raphson under-relaxation
514  end subroutine bnd_nur
515 
516  !> @ brief Convergence check for package.
517  !!
518  !! Perform additional convergence checks on the flow between the package
519  !! and the model it is attached to. This additional convergence check is
520  !! applied to packages that solve their own continuity equation as
521  !! part of the formulate step at the beginning of a Picard iteration.
522  !! A boundary package only needs to override this method if a specific boundary
523  !! package solves its own continuity equation. Example packages that implement
524  !! this additional convergence check is the CSUB, SFR, LAK, and UZF packages.
525  !<
526  subroutine bnd_cc(this, innertot, kiter, iend, icnvgmod, cpak, ipak, dpak)
527  ! -- dummy
528  class(bndtype), intent(inout) :: this !< BndType object
529  integer(I4B), intent(in) :: innertot !< total number of inner iterations
530  integer(I4B), intent(in) :: kiter !< Picard iteration number
531  integer(I4B), intent(in) :: iend !< flag indicating if this is the last Picard iteration
532  integer(I4B), intent(in) :: icnvgmod !< flag inficating if the model has met specific convergence criteria
533  character(len=LENPAKLOC), intent(inout) :: cpak !< string for user node
534  integer(I4B), intent(inout) :: ipak !< location of the maximum dependent variable change
535  real(DP), intent(inout) :: dpak !< maximum dependent variable change
536  !
537  ! -- No addition convergence check for boundary conditions
538  end subroutine bnd_cc
539 
540  !> @ brief Calculate advanced package flows.
541  !!
542  !! Calculate the flow between connected advanced package control volumes.
543  !! Only advanced boundary packages need to override this method.
544  !<
545  subroutine bnd_cq(this, x, flowja, iadv)
546  ! -- dummy
547  class(bndtype), intent(inout) :: this !< BndType object
548  real(DP), dimension(:), intent(in) :: x !< current dependent-variable value
549  real(DP), dimension(:), contiguous, intent(inout) :: flowja !< flow between two connected control volumes
550  integer(I4B), optional, intent(in) :: iadv !< flag that indicates if this is an advance package
551  ! -- local
552  integer(I4B) :: imover
553  !
554  ! -- check for iadv optional variable to indicate this is an advanced
555  ! package and that mover calculations should not be done here
556  if (present(iadv)) then
557  if (iadv == 1) then
558  imover = 0
559  else
560  imover = 1
561  end if
562  else
563  imover = this%imover
564  end if
565  !
566  ! -- Calculate package flows. In the first call, simval is calculated
567  ! from hcof, rhs, and head. The second call may reduce the value in
568  ! simval by what is sent to the mover. The mover rate is stored in
569  ! simtomvr. imover is set to zero here for advanced packages, which
570  ! handle and store mover quantities separately.
571  call this%bnd_cq_simrate(x, flowja, imover)
572  if (imover == 1) then
573  call this%bnd_cq_simtomvr(flowja)
574  end if
575  end subroutine bnd_cq
576 
577  !> @ brief Calculate simrate.
578  !!
579  !! Calculate the flow between package and the model (for example, GHB and
580  !! groundwater cell) and store in the simvals variable. This method only
581  !! needs to be overridden if a different calculation needs to be made.
582  !<
583  subroutine bnd_cq_simrate(this, hnew, flowja, imover)
584  ! -- dummy
585  class(bndtype) :: this !< BndType object
586  real(DP), dimension(:), intent(in) :: hnew !< current dependent-variable value
587  real(DP), dimension(:), intent(inout) :: flowja !< flow between package and model
588  integer(I4B), intent(in) :: imover !< flag indicating if the mover package is active
589  ! -- local
590  integer(I4B) :: i
591  integer(I4B) :: node
592  integer(I4B) :: idiag
593  real(DP) :: rrate
594  !
595  ! -- If no boundaries, skip flow calculations.
596  if (this%nbound > 0) then
597  !
598  ! -- Loop through each boundary calculating flow.
599  do i = 1, this%nbound
600  node = this%nodelist(i)
601  !
602  ! -- If cell is no-flow or constant-head, then ignore it.
603  rrate = dzero
604  if (node > 0) then
605  idiag = this%dis%con%ia(node)
606  if (this%ibound(node) > 0) then
607  !
608  ! -- Calculate the flow rate into the cell.
609  rrate = this%hcof(i) * hnew(node) - this%rhs(i)
610  end if
611  flowja(idiag) = flowja(idiag) + rrate
612  end if
613  !
614  ! -- Save simulated value to simvals array.
615  this%simvals(i) = rrate
616  !
617  end do
618  end if
619  end subroutine bnd_cq_simrate
620 
621  !> @ brief Calculate flow to the mover.
622  !!
623  !! Calculate the flow between package and the model that is sent to the
624  !! mover package and store in the simtomvr variable. This method only
625  !! needs to be overridden if a different calculation needs to be made.
626  !<
627  subroutine bnd_cq_simtomvr(this, flowja)
628  ! -- dummy
629  class(bndtype) :: this !< BndType object
630  real(DP), dimension(:), intent(inout) :: flowja !< flow between package and model
631  ! -- local
632  integer(I4B) :: i
633  integer(I4B) :: node
634  real(DP) :: q
635  real(DP) :: fact
636  real(DP) :: rrate
637  !
638  ! -- If no boundaries, skip flow calculations.
639  if (this%nbound > 0) then
640  !
641  ! -- Loop through each boundary calculating flow.
642  do i = 1, this%nbound
643  node = this%nodelist(i)
644  !
645  ! -- If cell is no-flow or constant-head, then ignore it.
646  rrate = dzero
647  if (node > 0) then
648  if (this%ibound(node) > 0) then
649  !
650  ! -- Calculate the flow rate into the cell.
651  q = this%simvals(i)
652 
653  if (q < dzero) then
654  rrate = this%pakmvrobj%get_qtomvr(i)
655  !
656  ! -- Evaluate if qtomvr exceeds the calculated rrate.
657  ! When fact is greater than 1, qtomvr is numerically
658  ! larger than rrate (which should never happen) and
659  ! represents a water budget error. When this happens,
660  ! rrate is set to 0. so that the water budget error is
661  ! correctly accounted for in the listing water budget.
662  fact = -rrate / q
663  if (fact > done) then
664  ! -- all flow goes to mover
665  q = dzero
666  else
667  ! -- magnitude of rrate (which is negative) is reduced by
668  ! qtomvr (which is positive)
669  q = q + rrate
670  end if
671  this%simvals(i) = q
672 
673  if (rrate > dzero) then
674  rrate = -rrate
675  end if
676  end if
677  end if
678  end if
679  !
680  ! -- Save simulated value to simtomvr array.
681  this%simtomvr(i) = rrate
682  !
683  end do
684  end if
685  end subroutine bnd_cq_simtomvr
686 
687  !> @ brief Add package flows to model budget.
688  !!
689  !! Add the flow between package and the model (ratin and ratout) to the
690  !! model budget. This method only needs to be overridden if a different
691  !! calculation needs to be made.
692  !<
693  subroutine bnd_bd(this, model_budget)
694  ! -- modules
695  use tdismodule, only: delt
697  ! -- dummy
698  class(bndtype) :: this !< BndType object
699  type(budgettype), intent(inout) :: model_budget !< model budget object
700  ! -- local
701  character(len=LENPACKAGENAME) :: text
702  real(DP) :: ratin
703  real(DP) :: ratout
704  integer(I4B) :: isuppress_output
705  !
706  ! -- initialize local variables
707  isuppress_output = 0
708  !
709  ! -- call accumulator and add to the model budget
710  call rate_accumulator(this%simvals(1:this%nbound), ratin, ratout)
711  call model_budget%addentry(ratin, ratout, delt, this%text, &
712  isuppress_output, this%packName)
713  if (this%imover == 1 .and. this%isadvpak == 0) then
714  text = trim(adjustl(this%text))//'-TO-MVR'
715  text = adjustr(text)
716  call rate_accumulator(this%simtomvr(1:this%nbound), ratin, ratout)
717  call model_budget%addentry(ratin, ratout, delt, text, &
718  isuppress_output, this%packName)
719  end if
720  end subroutine bnd_bd
721 
722  !> @ brief Output advanced package flow terms.
723  !!
724  !! Output advanced boundary package flow terms. This method only needs to
725  !! be overridden for advanced packages that save flow terms than contribute
726  !! to the continuity equation for each control volume.
727  !<
728  subroutine bnd_ot_package_flows(this, icbcfl, ibudfl)
729  ! -- dummy
730  class(bndtype) :: this !< BndType object
731  integer(I4B), intent(in) :: icbcfl !< flag and unit number for cell-by-cell output
732  integer(I4B), intent(in) :: ibudfl !< flag indication if cell-by-cell data should be saved
733  !
734  ! -- override for advanced packages
735  end subroutine bnd_ot_package_flows
736 
737  !> @ brief Output advanced package dependent-variable terms.
738  !!
739  !! Output advanced boundary package dependent-variable terms. This method only needs
740  !! to be overridden for advanced packages that save dependent variable terms
741  !! for each control volume.
742  !<
743  subroutine bnd_ot_dv(this, idvsave, idvprint)
744  ! -- dummy
745  class(bndtype) :: this !< BndType object
746  integer(I4B), intent(in) :: idvsave !< flag and unit number for dependent-variable output
747  integer(I4B), intent(in) :: idvprint !< flag indicating if dependent-variable should be written to the model listing file
748  !
749  ! -- override for advanced packages
750  end subroutine bnd_ot_dv
751 
752  !> @ brief Output advanced package budget summary.
753  !!
754  !! Output advanced boundary package budget summary. This method only needs
755  !! to be overridden for advanced packages that save budget summaries
756  !! to the model listing file.
757  !<
758  subroutine bnd_ot_bdsummary(this, kstp, kper, iout, ibudfl)
759  ! -- dummy
760  class(bndtype) :: this !< BndType object
761  integer(I4B), intent(in) :: kstp !< time step number
762  integer(I4B), intent(in) :: kper !< period number
763  integer(I4B), intent(in) :: iout !< flag and unit number for the model listing file
764  integer(I4B), intent(in) :: ibudfl !< flag indicating budget should be written
765  !
766  ! -- override for advanced packages
767  end subroutine bnd_ot_bdsummary
768 
769  !> @ brief Output package flow terms.
770  !!
771  !! Output flow terms between the boundary package and model to a binary file and/or
772  !! print flows to the model listing file. This method should not need to
773  !! be overridden.
774  !<
775  subroutine bnd_ot_model_flows(this, icbcfl, ibudfl, icbcun, imap)
776  ! -- dummy
777  class(bndtype) :: this !< BndType object
778  integer(I4B), intent(in) :: icbcfl !< flag for cell-by-cell output
779  integer(I4B), intent(in) :: ibudfl !< flag indication if cell-by-cell data should be saved
780  integer(I4B), intent(in) :: icbcun !< unit number for cell-by-cell output
781  integer(I4B), dimension(:), optional, intent(in) :: imap !< mapping vector that converts the 1 to nbound values to lake number, maw number, etc.
782  ! -- local
783  character(len=LINELENGTH) :: title
784  character(len=LENPACKAGENAME) :: text
785  integer(I4B) :: imover
786  !
787  ! -- Call generic subroutine to save and print simvals and simtomvr
788  title = trim(adjustl(this%text))//' PACKAGE ('//trim(this%packName)// &
789  ') FLOW RATES'
790  if (present(imap)) then
791  call save_print_model_flows(icbcfl, ibudfl, icbcun, this%iprflow, &
792  this%outputtab, this%nbound, this%nodelist, &
793  this%simvals, this%ibound, title, this%text, &
794  this%ipakcb, this%dis, this%naux, &
795  this%name_model, this%name_model, &
796  this%name_model, this%packName, &
797  this%auxname, this%auxvar, this%iout, &
798  this%inamedbound, this%boundname, imap)
799  else
800  call save_print_model_flows(icbcfl, ibudfl, icbcun, this%iprflow, &
801  this%outputtab, this%nbound, this%nodelist, &
802  this%simvals, this%ibound, title, this%text, &
803  this%ipakcb, this%dis, this%naux, &
804  this%name_model, this%name_model, &
805  this%name_model, this%packName, &
806  this%auxname, this%auxvar, this%iout, &
807  this%inamedbound, this%boundname)
808  end if
809  !
810  ! -- Set mover flag, and shut off if this is an advanced package. Advanced
811  ! packages must handle mover flows differently by including them in
812  ! their balance equations. These simtomvr flows are the general
813  ! flow to mover terms calculated by bnd_cq_simtomvr()
814  imover = this%imover
815  if (this%isadvpak /= 0) imover = 0
816  if (imover == 1) then
817  text = trim(adjustl(this%text))//'-TO-MVR'
818  text = adjustr(text)
819  title = trim(adjustl(this%text))//' PACKAGE ('// &
820  trim(this%packName)//') FLOW RATES TO-MVR'
821  call save_print_model_flows(icbcfl, ibudfl, icbcun, this%iprflow, &
822  this%outputtab, this%nbound, this%nodelist, &
823  this%simtomvr, this%ibound, title, text, &
824  this%ipakcb, this%dis, this%naux, &
825  this%name_model, this%name_model, &
826  this%name_model, this%packName, &
827  this%auxname, this%auxvar, this%iout, &
828  this%inamedbound, this%boundname)
829  end if
830  end subroutine bnd_ot_model_flows
831 
832  !> @ brief Deallocate package memory
833  !!
834  !! Deallocate base boundary package scalars and arrays. This method
835  !! only needs to be overridden if additional variables are defined
836  !! for a specific package.
837  !<
838  subroutine bnd_da(this)
839  ! -- modules
841  ! -- dummy
842  class(bndtype) :: this !< BndType object
843  !
844  ! -- deallocate arrays
845  call mem_deallocate(this%nodelist, 'NODELIST', this%memoryPath)
846  call mem_deallocate(this%noupdateauxvar, 'NOUPDATEAUXVAR', this%memoryPath)
847  call mem_deallocate(this%bound, 'BOUND', this%memoryPath)
848  call mem_deallocate(this%condinput, 'CONDINPUT', this%memoryPath)
849  call mem_deallocate(this%hcof, 'HCOF', this%memoryPath)
850  call mem_deallocate(this%rhs, 'RHS', this%memoryPath)
851  call mem_deallocate(this%simvals, 'SIMVALS', this%memoryPath)
852  call mem_deallocate(this%simtomvr, 'SIMTOMVR', this%memoryPath)
853  call mem_deallocate(this%auxvar, 'AUXVAR', this%memoryPath)
854  call mem_deallocate(this%boundname, 'BOUNDNAME', this%memoryPath)
855  call mem_deallocate(this%boundname_cst, 'BOUNDNAME_CST', this%memoryPath)
856  call mem_deallocate(this%auxname, 'AUXNAME', this%memoryPath)
857  call mem_deallocate(this%auxname_cst, 'AUXNAME_CST', this%memoryPath)
858  nullify (this%icelltype)
859  !
860  ! -- pakmvrobj
861  if (this%imover /= 0) then
862  call this%pakmvrobj%da()
863  deallocate (this%pakmvrobj)
864  nullify (this%pakmvrobj)
865  end if
866  !
867  ! -- input table object
868  if (associated(this%inputtab)) then
869  call this%inputtab%table_da()
870  deallocate (this%inputtab)
871  nullify (this%inputtab)
872  end if
873  !
874  ! -- output table object
875  if (associated(this%outputtab)) then
876  call this%outputtab%table_da()
877  deallocate (this%outputtab)
878  nullify (this%outputtab)
879  end if
880  !
881  ! -- error table object
882  if (associated(this%errortab)) then
883  call this%errortab%table_da()
884  deallocate (this%errortab)
885  nullify (this%errortab)
886  end if
887  !
888  ! -- deallocate character variables
889  call mem_deallocate(this%listlabel, 'LISTLABEL', this%memoryPath)
890  !
891  ! -- Deallocate scalars
892  call mem_deallocate(this%isadvpak)
893  call mem_deallocate(this%ibcnum)
894  call mem_deallocate(this%maxbound)
895  call mem_deallocate(this%nbound)
896  call mem_deallocate(this%ncolbnd)
897  call mem_deallocate(this%iscloc)
898  call mem_deallocate(this%naux)
899  call mem_deallocate(this%inamedbound)
900  call mem_deallocate(this%iauxmultcol)
901  call mem_deallocate(this%inobspkg)
902  call mem_deallocate(this%imover)
903  call mem_deallocate(this%npakeq)
904  call mem_deallocate(this%ioffset)
905  call mem_deallocate(this%ivsc)
906  !
907  ! -- deallocate methods on objects
908  call this%obs%obs_da()
909  call this%TsManager%da()
910  call this%TasManager%da()
911  !
912  ! -- deallocate objects
913  deallocate (this%obs)
914  deallocate (this%TsManager)
915  deallocate (this%TasManager)
916  nullify (this%TsManager)
917  nullify (this%TasManager)
918  !
919  ! -- Deallocate parent object
920  call this%NumericalPackageType%da()
921  end subroutine bnd_da
922 
923  !> @ brief Allocate package scalars
924  !!
925  !! Allocate and initialize base boundary package scalars. This method
926  !! only needs to be overridden if additional scalars are defined
927  !! for a specific package.
928  !<
929  subroutine allocate_scalars(this)
930  ! -- modules
933  ! -- dummy
934  class(bndtype) :: this !< BndType object
935  ! -- local
936  integer(I4B), pointer :: imodelnewton => null()
937  !
938  ! -- allocate scalars in NumericalPackageType
939  call this%NumericalPackageType%allocate_scalars()
940  !
941  ! -- allocate character variables
942  call mem_allocate(this%listlabel, lenlistlabel, 'LISTLABEL', &
943  this%memoryPath)
944  !
945  ! -- allocate integer variables
946  call mem_allocate(this%isadvpak, 'ISADVPAK', this%memoryPath)
947  call mem_allocate(this%ibcnum, 'IBCNUM', this%memoryPath)
948  call mem_allocate(this%maxbound, 'MAXBOUND', this%memoryPath)
949  call mem_allocate(this%nbound, 'NBOUND', this%memoryPath)
950  call mem_allocate(this%ncolbnd, 'NCOLBND', this%memoryPath)
951  call mem_allocate(this%iscloc, 'ISCLOC', this%memoryPath)
952  call mem_allocate(this%naux, 'NAUX', this%memoryPath)
953  call mem_allocate(this%inamedbound, 'INAMEDBOUND', this%memoryPath)
954  call mem_allocate(this%iauxmultcol, 'IAUXMULTCOL', this%memoryPath)
955  call mem_allocate(this%inobspkg, 'INOBSPKG', this%memoryPath)
956  !
957  ! -- allocate the object and assign values to object variables
958  call mem_allocate(this%imover, 'IMOVER', this%memoryPath)
959  !
960  ! -- allocate flag for determining if vsc active
961  call mem_allocate(this%ivsc, 'IVSC', this%memoryPath)
962  !
963  ! -- allocate scalars for packages that add rows to the matrix (e.g. MAW)
964  call mem_allocate(this%npakeq, 'NPAKEQ', this%memoryPath)
965  call mem_allocate(this%ioffset, 'IOFFSET', this%memoryPath)
966  !
967  ! -- allocate TS objects
968  allocate (this%TsManager)
969  allocate (this%TasManager)
970  !
971  ! -- allocate text strings
972  call mem_allocate(this%auxname, lenauxname, 0, 'AUXNAME', this%memoryPath)
973  call mem_allocate(this%auxname_cst, lenauxname, 0, 'AUXNAME_CST', &
974  this%memoryPath)
975  !
976  ! -- Initialize variables
977  this%isadvpak = 0
978  this%ibcnum = 0
979  this%maxbound = 0
980  this%nbound = 0
981  this%ncolbnd = 0
982  this%iscloc = 0
983  this%naux = 0
984  this%inamedbound = 0
985  this%iauxmultcol = 0
986  this%inobspkg = 0
987  this%imover = 0
988  this%npakeq = 0
989  this%ioffset = 0
990  this%ivsc = 0
991  !
992  ! -- Set pointer to model inewton variable
993  call mem_setptr(imodelnewton, 'INEWTON', create_mem_path(this%name_model))
994  this%inewton = imodelnewton
995  imodelnewton => null()
996  end subroutine allocate_scalars
997 
998  !> @ brief Allocate package arrays
999  !!
1000  !! Allocate and initialize base boundary package arrays. This method
1001  !! only needs to be overridden if additional arrays are defined
1002  !! for a specific package.
1003  !<
1004  subroutine allocate_arrays(this, nodelist, auxvar)
1005  ! -- modules
1007  ! -- dummy
1008  class(bndtype) :: this !< BndType object
1009  integer(I4B), dimension(:), pointer, contiguous, optional :: nodelist !< package nodelist
1010  real(DP), dimension(:, :), pointer, contiguous, optional :: auxvar !< package aux variable array
1011  ! -- local
1012  integer(I4B) :: i
1013  integer(I4B) :: j
1014  !
1015  ! -- Point nodelist if it is passed in, otherwise allocate
1016  if (present(nodelist)) then
1017  this%nodelist => nodelist
1018  else
1019  call mem_allocate(this%nodelist, this%maxbound, 'NODELIST', &
1020  this%memoryPath)
1021  do j = 1, this%maxbound
1022  this%nodelist(j) = 0
1023  end do
1024  end if
1025  !
1026  ! -- noupdateauxvar (allows an external caller to stop auxvars from being
1027  ! recalculated
1028  call mem_allocate(this%noupdateauxvar, this%naux, 'NOUPDATEAUXVAR', &
1029  this%memoryPath)
1030  this%noupdateauxvar(:) = 0
1031  !
1032  ! -- Allocate the bound array
1033  call mem_allocate(this%bound, this%ncolbnd, this%maxbound, 'BOUND', &
1034  this%memoryPath)
1035  !
1036  !-- Allocate array for storing user-specified conductances
1037  ! Will be reallocated to size maxbound if vsc active
1038  call mem_allocate(this%condinput, 0, 'CONDINPUT', this%memoryPath)
1039  !
1040  ! -- Allocate hcof and rhs
1041  call mem_allocate(this%hcof, this%maxbound, 'HCOF', this%memoryPath)
1042  call mem_allocate(this%rhs, this%maxbound, 'RHS', this%memoryPath)
1043  !
1044  ! -- Allocate the simvals array
1045  call mem_allocate(this%simvals, this%maxbound, 'SIMVALS', this%memoryPath)
1046  if (this%imover == 1) then
1047  call mem_allocate(this%simtomvr, this%maxbound, 'SIMTOMVR', &
1048  this%memoryPath)
1049  do i = 1, this%maxbound
1050  this%simtomvr(i) = dzero
1051  end do
1052  else
1053  call mem_allocate(this%simtomvr, 0, 'SIMTOMVR', this%memoryPath)
1054  end if
1055  !
1056  ! -- Point or allocate auxvar
1057  if (present(auxvar)) then
1058  this%auxvar => auxvar
1059  else
1060  call mem_allocate(this%auxvar, this%naux, this%maxbound, 'AUXVAR', &
1061  this%memoryPath)
1062  do i = 1, this%maxbound
1063  do j = 1, this%naux
1064  this%auxvar(j, i) = dzero
1065  end do
1066  end do
1067  end if
1068  !
1069  ! -- Allocate boundname
1070  if (this%inamedbound /= 0) then
1071  call mem_allocate(this%boundname, lenboundname, this%maxbound, &
1072  'BOUNDNAME', this%memoryPath)
1073  call mem_allocate(this%boundname_cst, lenboundname, this%maxbound, &
1074  'BOUNDNAME_CST', this%memoryPath)
1075  else
1076  call mem_allocate(this%boundname, lenboundname, 0, &
1077  'BOUNDNAME', this%memoryPath)
1078  call mem_allocate(this%boundname_cst, lenboundname, 0, &
1079  'BOUNDNAME_CST', this%memoryPath)
1080  end if
1081  !
1082  ! -- Set pointer to ICELLTYPE. For GWF boundary packages,
1083  ! this%ictMemPath will be 'NPF'. If boundary packages do not set
1084  ! this%ictMemPath, then icelltype will remain as null()
1085  if (this%ictMemPath /= '') then
1086  call mem_setptr(this%icelltype, 'ICELLTYPE', this%ictMemPath)
1087  end if
1088  !
1089  ! -- Initialize values
1090  do j = 1, this%maxbound
1091  do i = 1, this%ncolbnd
1092  this%bound(i, j) = dzero
1093  end do
1094  end do
1095  do i = 1, this%maxbound
1096  this%hcof(i) = dzero
1097  this%rhs(i) = dzero
1098  end do
1099  !
1100  ! -- setup the output table
1101  call this%pak_setup_outputtab()
1102  end subroutine allocate_arrays
1103 
1104  !> @ brief Allocate and initialize select package members
1105  !!
1106  !! Allocate and initialize select base boundary package members.
1107  !! This method needs to be overridden by a package if it is
1108  !! needed for a specific package.
1109  !<
1110  subroutine pack_initialize(this)
1111  ! -- dummy
1112  class(bndtype) :: this !< BndType object
1113  end subroutine pack_initialize
1114 
1115  !> @ brief Set pointers to model variables
1116  !!
1117  !! Set pointers to model variables so that a package has access to these
1118  !! variables. This base method should not need to be overridden.
1119  !<
1120  subroutine set_pointers(this, neq, ibound, xnew, xold, flowja)
1121  ! -- dummy
1122  class(bndtype) :: this !< BndType object
1123  integer(I4B), pointer :: neq !< number of equations in the model
1124  integer(I4B), dimension(:), pointer, contiguous :: ibound !< model idomain
1125  real(DP), dimension(:), pointer, contiguous :: xnew !< current dependent variable
1126  real(DP), dimension(:), pointer, contiguous :: xold !< previous dependent variable
1127  real(DP), dimension(:), pointer, contiguous :: flowja !< connection flow terms
1128  !
1129  ! -- Set the pointers
1130  this%neq => neq
1131  this%ibound => ibound
1132  this%xnew => xnew
1133  this%xold => xold
1134  this%flowja => flowja
1135  end subroutine set_pointers
1136 
1137  !> @ brief Read additional options for package
1138  !!
1139  !! Read base options for boundary packages.
1140  !<
1141  subroutine bnd_read_options(this)
1142  ! -- modules
1143  use inputoutputmodule, only: urdaux
1145  ! -- dummy
1146  class(bndtype), intent(inout) :: this !< BndType object
1147  ! -- local
1148  character(len=:), allocatable :: line
1149  character(len=LINELENGTH) :: fname
1150  character(len=LINELENGTH) :: keyword
1151  character(len=LENAUXNAME) :: sfacauxname
1152  character(len=LENAUXNAME), dimension(:), allocatable :: caux
1153  integer(I4B) :: lloc
1154  integer(I4B) :: istart
1155  integer(I4B) :: istop
1156  integer(I4B) :: n
1157  integer(I4B) :: ierr
1158  integer(I4B) :: inobs
1159  logical(LGP) :: isfound
1160  logical(LGP) :: endOfBlock
1161  logical(LGP) :: foundchildclassoption
1162  ! -- format
1163  character(len=*), parameter :: fmtflow = &
1164  &"(4x, 'FLOWS WILL BE SAVED TO FILE: ', a, /4x, 'OPENED ON UNIT: ', I7)"
1165  character(len=*), parameter :: fmtflow2 = &
1166  &"(4x, 'FLOWS WILL BE SAVED TO BUDGET FILE SPECIFIED IN OUTPUT CONTROL')"
1167  character(len=*), parameter :: fmttas = &
1168  &"(4x, 'TIME-ARRAY SERIES DATA WILL BE READ FROM FILE: ', a)"
1169  character(len=*), parameter :: fmtts = &
1170  &"(4x, 'TIME-SERIES DATA WILL BE READ FROM FILE: ', a)"
1171  character(len=*), parameter :: fmtnme = &
1172  &"(a, i0, a)"
1173  !
1174  ! -- set default options
1175  !
1176  ! -- get options block
1177  call this%parser%GetBlock('OPTIONS', isfound, ierr, &
1178  supportopenclose=.true., blockrequired=.false.)
1179  !
1180  ! -- parse options block if detected
1181  if (isfound) then
1182  write (this%iout, '(/1x,a)') 'PROCESSING '//trim(adjustl(this%text)) &
1183  //' OPTIONS'
1184  do
1185  call this%parser%GetNextLine(endofblock)
1186  if (endofblock) then
1187  exit
1188  end if
1189  call this%parser%GetStringCaps(keyword)
1190  select case (keyword)
1191  case ('AUX', 'AUXILIARY')
1192  call this%parser%GetRemainingLine(line)
1193  lloc = 1
1194  call urdaux(this%naux, this%parser%iuactive, this%iout, lloc, &
1195  istart, istop, caux, line, this%text)
1196  call mem_reallocate(this%auxname, lenauxname, this%naux, &
1197  'AUXNAME', this%memoryPath)
1198  call mem_reallocate(this%auxname_cst, lenauxname, this%naux, &
1199  'AUXNAME_CST', this%memoryPath)
1200  do n = 1, this%naux
1201  this%auxname(n) = caux(n)
1202  this%auxname_cst(n) = caux(n)
1203  end do
1204  deallocate (caux)
1205  case ('SAVE_FLOWS')
1206  this%ipakcb = -1
1207  write (this%iout, fmtflow2)
1208  case ('PRINT_INPUT')
1209  this%iprpak = 1
1210  write (this%iout, '(4x,a)') &
1211  'LISTS OF '//trim(adjustl(this%text))//' CELLS WILL BE PRINTED.'
1212  case ('PRINT_FLOWS')
1213  this%iprflow = 1
1214  write (this%iout, '(4x,a)') trim(adjustl(this%text))// &
1215  ' FLOWS WILL BE PRINTED TO LISTING FILE.'
1216  case ('BOUNDNAMES')
1217  this%inamedbound = 1
1218  write (this%iout, '(4x,a)') trim(adjustl(this%text))// &
1219  ' BOUNDARIES HAVE NAMES IN LAST COLUMN.'
1220  case ('TS6')
1221  call this%parser%GetStringCaps(keyword)
1222  if (trim(adjustl(keyword)) /= 'FILEIN') then
1223  errmsg = 'TS6 keyword must be followed by "FILEIN" '// &
1224  'then by filename.'
1225  call store_error(errmsg)
1226  end if
1227  call this%parser%GetString(fname)
1228  write (this%iout, fmtts) trim(fname)
1229  call this%TsManager%add_tsfile(fname, this%inunit)
1230  case ('TAS6')
1231  if (this%AllowTimeArraySeries) then
1232  if (.not. this%dis%supports_layers()) then
1233  errmsg = 'TAS6 FILE cannot be used '// &
1234  'with selected discretization type.'
1235  call store_error(errmsg)
1236  end if
1237  else
1238  errmsg = 'The '//trim(this%filtyp)// &
1239  ' package does not support TIMEARRAYSERIESFILE'
1240  call store_error(errmsg)
1241  call this%parser%StoreErrorUnit()
1242  end if
1243  call this%parser%GetStringCaps(keyword)
1244  if (trim(adjustl(keyword)) /= 'FILEIN') then
1245  errmsg = 'TAS6 keyword must be followed by "FILEIN" '// &
1246  'then by filename.'
1247  call store_error(errmsg)
1248  call this%parser%StoreErrorUnit()
1249  end if
1250  call this%parser%GetString(fname)
1251  write (this%iout, fmttas) trim(fname)
1252  call this%TasManager%add_tasfile(fname)
1253  case ('AUXMULTNAME')
1254  call this%parser%GetStringCaps(sfacauxname)
1255  this%iauxmultcol = -1
1256  write (this%iout, '(4x,a,a)') &
1257  'AUXILIARY MULTIPLIER NAME: ', sfacauxname
1258  case ('OBS6')
1259  call this%parser%GetStringCaps(keyword)
1260  if (trim(adjustl(keyword)) /= 'FILEIN') then
1261  errmsg = 'OBS6 keyword must be followed by "FILEIN" '// &
1262  'then by filename.'
1263  call store_error(errmsg)
1264  call this%parser%StoreErrorUnit()
1265  end if
1266  if (this%obs%active) then
1267  errmsg = 'Multiple OBS6 keywords detected in OPTIONS block. '// &
1268  'Only one OBS6 entry allowed for a package.'
1269  call store_error(errmsg)
1270  end if
1271  this%obs%active = .true.
1272  call this%parser%GetString(this%obs%inputFilename)
1273  inobs = getunit()
1274  call openfile(inobs, this%iout, this%obs%inputFilename, 'OBS')
1275  this%obs%inUnitObs = inobs
1276  !
1277  ! -- right now these are options that are only available in the
1278  ! development version and are not included in the documentation.
1279  ! These options are only available when IDEVELOPMODE in
1280  ! constants module is set to 1
1281  case ('DEV_NO_NEWTON')
1282  call this%parser%DevOpt()
1283  this%inewton = 0
1284  write (this%iout, '(4x,a)') &
1285  'NEWTON-RAPHSON method disabled for unconfined cells'
1286  case default
1287  !
1288  ! -- Check for child class options
1289  call this%bnd_options(keyword, foundchildclassoption)
1290  !
1291  ! -- No child class options found, so print error message
1292  if (.not. foundchildclassoption) then
1293  write (errmsg, '(a,3(1x,a))') &
1294  'UNKNOWN', trim(adjustl(this%text)), 'OPTION:', trim(keyword)
1295  call store_error(errmsg)
1296  end if
1297  end select
1298  end do
1299  write (this%iout, '(1x,a)') &
1300  'END OF '//trim(adjustl(this%text))//' OPTIONS'
1301  else
1302  write (this%iout, '(1x,a)') 'NO '//trim(adjustl(this%text))// &
1303  ' OPTION BLOCK DETECTED.'
1304  end if
1305  !
1306  ! -- AUXMULTNAME was specified, so find column of auxvar that will be multiplier
1307  if (this%iauxmultcol < 0) then
1308  !
1309  ! -- Error if no aux variable specified
1310  if (this%naux == 0) then
1311  write (errmsg, '(a,2(1x,a))') &
1312  'AUXMULTNAME was specified as', trim(adjustl(sfacauxname)), &
1313  'but no AUX variables specified.'
1314  call store_error(errmsg)
1315  end if
1316  !
1317  ! -- Assign mult column
1318  this%iauxmultcol = 0
1319  do n = 1, this%naux
1320  if (sfacauxname == this%auxname(n)) then
1321  this%iauxmultcol = n
1322  exit
1323  end if
1324  end do
1325  !
1326  ! -- Error if aux variable cannot be found
1327  if (this%iauxmultcol == 0) then
1328  write (errmsg, '(a,2(1x,a))') &
1329  'AUXMULTNAME was specified as', trim(adjustl(sfacauxname)), &
1330  'but no AUX variable found with this name.'
1331  call store_error(errmsg)
1332  end if
1333  end if
1334  !
1335  ! -- terminate if errors were detected
1336  if (count_errors() > 0) then
1337  call this%parser%StoreErrorUnit()
1338  end if
1339  end subroutine bnd_read_options
1340 
1341  !> @ brief Read dimensions for package
1342  !!
1343  !! Read base dimensions for boundary packages. This method should not
1344  !! need to be overridden unless more than MAXBOUND is specified in the
1345  !! DIMENSIONS block.
1346  !<
1347  subroutine bnd_read_dimensions(this)
1348  ! -- dummy
1349  class(bndtype), intent(inout) :: this !< BndType object
1350  ! -- local
1351  character(len=LINELENGTH) :: keyword
1352  logical(LGP) :: isfound
1353  logical(LGP) :: endOfBlock
1354  integer(I4B) :: ierr
1355  !
1356  ! -- get dimensions block
1357  call this%parser%GetBlock('DIMENSIONS', isfound, ierr, &
1358  supportopenclose=.true.)
1359  !
1360  ! -- parse dimensions block if detected
1361  if (isfound) then
1362  write (this%iout, '(/1x,a)') 'PROCESSING '//trim(adjustl(this%text))// &
1363  ' DIMENSIONS'
1364  do
1365  call this%parser%GetNextLine(endofblock)
1366  if (endofblock) exit
1367  call this%parser%GetStringCaps(keyword)
1368  select case (keyword)
1369  case ('MAXBOUND')
1370  this%maxbound = this%parser%GetInteger()
1371  write (this%iout, '(4x,a,i7)') 'MAXBOUND = ', this%maxbound
1372  case default
1373  write (errmsg, '(a,3(1x,a))') &
1374  'Unknown', trim(this%text), 'dimension:', trim(keyword)
1375  call store_error(errmsg)
1376  end select
1377  end do
1378  !
1379  write (this%iout, '(1x,a)') &
1380  'END OF '//trim(adjustl(this%text))//' DIMENSIONS'
1381  else
1382  call store_error('Required DIMENSIONS block not found.')
1383  call this%parser%StoreErrorUnit()
1384  end if
1385  !
1386  ! -- verify dimensions were set
1387  if (this%maxbound <= 0) then
1388  write (errmsg, '(a)') 'MAXBOUND must be an integer greater than zero.'
1389  call store_error(errmsg)
1390  end if
1391  !
1392  ! -- terminate if there are errors
1393  if (count_errors() > 0) then
1394  call this%parser%StoreErrorUnit()
1395  end if
1396  !
1397  ! -- Call define_listlabel to construct the list label that is written
1398  ! when PRINT_INPUT option is used.
1399  call this%define_listlabel()
1400  end subroutine bnd_read_dimensions
1401 
1402  !> @ brief Store user-specified conductances when vsc is active
1403  !!
1404  !! VSC will update boundary package conductance values. Because
1405  !! viscosity can change every stress period, but user-specified
1406  !! conductances may not, the base user-input should be stored in
1407  !! backup array so that viscosity-updated conductances may be
1408  !! recalculated every stress period/time step
1409  !<
1410  subroutine bnd_store_user_cond(this, nlist, rlist, condinput)
1411  ! -- modules
1412  use simmodule, only: store_error
1413  ! -- dummy
1414  class(bndtype), intent(inout) :: this !< BndType object
1415  integer(I4B), intent(in) :: nlist
1416  real(DP), dimension(:, :), pointer, contiguous, intent(in) :: rlist
1417  real(DP), dimension(:), pointer, contiguous, intent(inout) :: condinput
1418  ! -- local
1419  integer(I4B) :: l
1420  !
1421  ! -- store backup copy of conductance values
1422  do l = 1, nlist
1423  condinput(l) = rlist(2, l)
1424  end do
1425  end subroutine bnd_store_user_cond
1426 
1427  !> @ brief Read initial parameters for package
1428  !!
1429  !! Read initial parameters for a boundary package. This method is not
1430  !! needed for most boundary packages. The SFR package is an example of a
1431  !! package that has overridden this method.
1432  !<
1433  subroutine bnd_read_initial_attr(this)
1434  ! -- dummy
1435  class(bndtype), intent(inout) :: this !< BndType object
1436  end subroutine bnd_read_initial_attr
1437 
1438  !> @ brief Read additional options for package
1439  !!
1440  !! Read additional options for a boundary package. This method should
1441  !! be overridden options in addition to the base options are implemented
1442  !! in a boundary package.
1443  !<
1444  subroutine bnd_options(this, option, found)
1445  ! -- dummy
1446  class(bndtype), intent(inout) :: this !< BndType object
1447  character(len=*), intent(inout) :: option !< option keyword string
1448  logical(LGP), intent(inout) :: found !< boolean indicating if the option was found
1449  !
1450  ! Return with found = .false.
1451  found = .false.
1452  end subroutine bnd_options
1453 
1454  !> @ brief Copy boundnames into boundnames_cst
1455  !!
1456  !! boundnames_cst is an array of type(CharacterStringType),
1457  !! which can be stored in the MemoryManager.
1458  !<
1459  subroutine copy_boundname(this)
1460  ! -- dummy
1461  class(bndtype), intent(inout) :: this !< BndType object
1462  ! -- local
1463  integer(I4B) :: i
1464  !
1465  ! copy from boundname to boundname_cst, which can be
1466  ! stored in the memory manager
1467  if (this%inamedbound /= 0) then
1468  do i = 1, size(this%boundname)
1469  this%boundname_cst(i) = this%boundname(i)
1470  end do
1471  end if
1472  end subroutine copy_boundname
1473 
1474  !> @ brief Setup output table for package
1475  !!
1476  !! Setup output table for a boundary package that is used to output
1477  !! package to model flow terms to the model listing file.
1478  !<
1479  subroutine pak_setup_outputtab(this)
1480  ! -- dummy
1481  class(bndtype), intent(inout) :: this !< BndType object
1482  ! -- local
1483  character(len=LINELENGTH) :: title
1484  character(len=LINELENGTH) :: text
1485  integer(I4B) :: ntabcol
1486  !
1487  ! -- allocate and initialize the output table
1488  if (this%iprflow /= 0) then
1489  !
1490  ! -- dimension table
1491  ntabcol = 3
1492  if (this%inamedbound > 0) then
1493  ntabcol = ntabcol + 1
1494  end if
1495  !
1496  ! -- initialize the output table object
1497  title = trim(adjustl(this%text))//' PACKAGE ('//trim(this%packName)// &
1498  ') FLOW RATES'
1499  call table_cr(this%outputtab, this%packName, title)
1500  call this%outputtab%table_df(this%maxbound, ntabcol, this%iout, &
1501  transient=.true.)
1502  text = 'NUMBER'
1503  call this%outputtab%initialize_column(text, 10, alignment=tabcenter)
1504  text = 'CELLID'
1505  call this%outputtab%initialize_column(text, 20, alignment=tableft)
1506  text = 'RATE'
1507  call this%outputtab%initialize_column(text, 15, alignment=tabcenter)
1508  if (this%inamedbound > 0) then
1509  text = 'NAME'
1510  call this%outputtab%initialize_column(text, lenboundname, &
1511  alignment=tableft)
1512  end if
1513  end if
1514  end subroutine pak_setup_outputtab
1515 
1516  !> @ brief Define the list label for the package
1517  !!
1518  !! Method defined the list label for the boundary package. This method
1519  !! needs to be overridden by each boundary package.
1520  !<
1521  subroutine define_listlabel(this)
1522  ! -- dummy
1523  class(bndtype), intent(inout) :: this !< BndType object
1524  end subroutine define_listlabel
1525 
1526  ! -- Procedures related to observations
1527 
1528  !> @brief Determine if observations are supported.
1529  !!
1530  !! Function to determine if observations are supported by the boundary package.
1531  !! By default, observations are not supported. This method should be overridden
1532  !! if observations are supported in a boundary package.
1533  !!
1534  !! @return supported boolean indicating if observations are supported
1535  !<
1536  function bnd_obs_supported(this) result(supported)
1537  ! -- return variable
1538  logical(LGP) :: supported !< boolean indicating if observations are supported
1539  ! -- dummy
1540  class(bndtype) :: this !< BndType object
1541  !
1542  ! -- initialize return variables
1543  supported = .false.
1544  end function bnd_obs_supported
1545 
1546  !> @brief Define the observation types available in the package
1547  !!
1548  !! Method to define the observation types available in a boundary
1549  !! package. This method should be overridden if observations are
1550  !! supported in a boundary package.
1551  !<
1552  subroutine bnd_df_obs(this)
1553  !
1554  ! -- dummy
1555  class(bndtype) :: this !< BndType object
1556  !
1557  ! -- do nothing here. Override as needed.
1558  end subroutine bnd_df_obs
1559 
1560  !> @brief Read and prepare observations for a package
1561  !!
1562  !! Method to read and prepare observations for a boundary package
1563  !! This method should not need to be overridden for most boundary
1564  !! packages.
1565  !<
1566  subroutine bnd_rp_obs(this)
1567  ! -- dummy
1568  class(bndtype), intent(inout) :: this !< BndType object
1569  ! -- local
1570  integer(I4B) :: i
1571  integer(I4B) :: j
1572  class(observetype), pointer :: obsrv => null()
1573  character(len=LENBOUNDNAME) :: bname
1574  logical(LGP) :: jfound
1575  !
1576  if (.not. this%bnd_obs_supported()) return
1577  !
1578  do i = 1, this%obs%npakobs
1579  obsrv => this%obs%pakobs(i)%obsrv
1580  !
1581  ! -- indxbnds needs to be reset each stress period because
1582  ! list of boundaries can change each stress period.
1583  call obsrv%ResetObsIndex()
1584  obsrv%BndFound = .false.
1585  !
1586  bname = obsrv%FeatureName
1587  if (bname /= '') then
1588  !
1589  ! -- Observation location(s) is(are) based on a boundary name.
1590  ! Iterate through all boundaries to identify and store
1591  ! corresponding index(indices) in bound array.
1592  jfound = .false.
1593  do j = 1, this%nbound
1594  if (this%boundname(j) == bname) then
1595  jfound = .true.
1596  obsrv%BndFound = .true.
1597  obsrv%CurrentTimeStepEndValue = dzero
1598  call obsrv%AddObsIndex(j)
1599  end if
1600  end do
1601  else
1602  !
1603  ! -- Observation location is a single node number
1604  jfound = .false.
1605  jloop: do j = 1, this%nbound
1606  if (this%nodelist(j) == obsrv%NodeNumber) then
1607  jfound = .true.
1608  obsrv%BndFound = .true.
1609  obsrv%CurrentTimeStepEndValue = dzero
1610  call obsrv%AddObsIndex(j)
1611  end if
1612  end do jloop
1613  end if
1614  end do
1615  !
1616  if (count_errors() > 0) then
1617  call store_error_unit(this%inunit)
1618  end if
1619  end subroutine bnd_rp_obs
1620 
1621  !> @brief Save observations for the package
1622  !!
1623  !! Method to save simulated values for the boundary package.
1624  !! This method will need to be overridden for boundary packages
1625  !! with more observations than the calculate flow term (simvals)
1626  !! and to-mover.
1627  !<
1628  subroutine bnd_bd_obs(this)
1629  ! -- dummy
1630  class(bndtype) :: this !< BndType object
1631  ! -- local
1632  integer(I4B) :: i
1633  integer(I4B) :: n
1634  real(DP) :: v
1635  type(observetype), pointer :: obsrv => null()
1636  !
1637  ! -- clear the observations
1638  call this%obs%obs_bd_clear()
1639  !
1640  ! -- Save simulated values for all of package's observations.
1641  do i = 1, this%obs%npakobs
1642  obsrv => this%obs%pakobs(i)%obsrv
1643  if (obsrv%BndFound) then
1644  do n = 1, obsrv%indxbnds_count
1645  if (obsrv%ObsTypeId == 'TO-MVR') then
1646  if (this%imover == 1) then
1647  v = this%pakmvrobj%get_qtomvr(obsrv%indxbnds(n))
1648  if (v > dzero) then
1649  v = -v
1650  end if
1651  else
1652  v = dnodata
1653  end if
1654  else
1655  v = this%simvals(obsrv%indxbnds(n))
1656  end if
1657  call this%obs%SaveOneSimval(obsrv, v)
1658  end do
1659  else
1660  call this%obs%SaveOneSimval(obsrv, dnodata)
1661  end if
1662  end do
1663  end subroutine bnd_bd_obs
1664 
1665  !> @brief Output observations for the package
1666  !!
1667  !! Method to output simulated values for the boundary package.
1668  !! This method should not need to be overridden.
1669  !<
1670  subroutine bnd_ot_obs(this)
1671  ! -- dummy
1672  class(bndtype) :: this !< BndType object
1673  !
1674  ! -- call the observation output method
1675  call this%obs%obs_ot()
1676  end subroutine bnd_ot_obs
1677 
1678  ! -- Procedures related to time series
1679 
1680  !> @brief Assign time series links for the package
1681  !!
1682  !! Assign the time series links for the boundary package. This
1683  !! method will need to be overridden for boundary packages that
1684  !! support time series.
1685  !<
1686  subroutine bnd_rp_ts(this)
1687  ! -- dummy
1688  class(bndtype), intent(inout) :: this
1689  end subroutine bnd_rp_ts
1690 
1691  ! -- Procedures related to casting
1692 
1693  !> @brief Cast as a boundary type
1694  !!
1695  !! Subroutine to cast an object as a boundary package type.
1696  !<
1697  function castasbndclass(obj) result(res)
1698  class(*), pointer, intent(inout) :: obj !< input object
1699  class(bndtype), pointer :: res !< output class of type BndType
1700  !
1701  ! -- initialize res
1702  res => null()
1703  !
1704  ! -- make sure obj is associated
1705  if (.not. associated(obj)) return
1706  !
1707  ! -- point res to obj
1708  select type (obj)
1709  class is (bndtype)
1710  res => obj
1711  end select
1712  end function castasbndclass
1713 
1714  !> @brief Add boundary to package list
1715  !!
1716  !! Subroutine to add a boundary package to a package list.
1717  !<
1718  subroutine addbndtolist(list, bnd)
1719  ! -- dummy
1720  type(listtype), intent(inout) :: list !< package list
1721  class(bndtype), pointer, intent(inout) :: bnd !< boundary package
1722  ! -- local
1723  class(*), pointer :: obj
1724  !
1725  obj => bnd
1726  call list%Add(obj)
1727  end subroutine addbndtolist
1728 
1729  !> @brief Get boundary from package list
1730  !!
1731  !! Function to get a boundary package from a package list.
1732  !!
1733  !! @return res boundary package object
1734  !<
1735  function getbndfromlist(list, idx) result(res)
1736  ! -- dummy
1737  type(listtype), intent(inout) :: list !< package list
1738  integer(I4B), intent(in) :: idx !< package number
1739  class(bndtype), pointer :: res !< boundary package idx
1740  ! -- local
1741  class(*), pointer :: obj
1742  !
1743  ! -- get the package from the list
1744  obj => list%GetItem(idx)
1745  res => castasbndclass(obj)
1746  end function getbndfromlist
1747 
1748  !> @brief Save and/or print flows for a package
1749  !!
1750  !! Subroutine to save and/or print package flows to a model to a
1751  !! binary cell-by-cell flow file and the model listing file.
1752  !<
1753  subroutine save_print_model_flows(icbcfl, ibudfl, icbcun, iprflow, &
1754  outputtab, nbound, nodelist, flow, ibound, &
1755  title, text, ipakcb, dis, naux, textmodel, &
1756  textpackage, dstmodel, dstpackage, &
1757  auxname, auxvar, iout, inamedbound, &
1758  boundname, imap)
1759  ! -- modules
1760  use tdismodule, only: kstp, kper
1761  ! -- dummy
1762  integer(I4B), intent(in) :: icbcfl !< flag indicating if the flow should be saved to the binary cell-by-cell flow file
1763  integer(I4B), intent(in) :: ibudfl !< flag indicating if the flow should be saved or printed
1764  integer(I4B), intent(in) :: icbcun !< file unit number for the binary cell-by-cell file
1765  integer(I4B), intent(in) :: iprflow !< print flows to list file
1766  type(tabletype), pointer, intent(inout) :: outputtab !< output table object
1767  integer(I4B), intent(in) :: nbound !< number of boundaries this stress period
1768  integer(I4B), dimension(:), contiguous, intent(in) :: nodelist !< boundary node list
1769  real(dp), dimension(:), contiguous, intent(in) :: flow !< boundary flow terms
1770  integer(I4B), dimension(:), contiguous, intent(in) :: ibound !< ibound array for the model
1771  character(len=*), intent(in) :: title !< title for the output table
1772  character(len=*), intent(in) :: text !< flow term description
1773  integer(I4B), intent(in) :: ipakcb !< flag indicating if flows will be saved
1774  class(disbasetype), intent(in) :: dis !< model discretization object
1775  integer(I4B), intent(in) :: naux !< number of aux variables
1776  character(len=*), intent(in) :: textmodel !< model name
1777  character(len=*), intent(in) :: textpackage !< package name
1778  character(len=*), intent(in) :: dstmodel !< mover destination model
1779  character(len=*), intent(in) :: dstpackage !< mover destination package
1780  character(len=*), dimension(:), intent(in) :: auxname !< aux variable name
1781  real(dp), dimension(:, :), intent(in) :: auxvar !< aux variable
1782  integer(I4B), intent(in) :: iout !< model listing file unit
1783  integer(I4B), intent(in) :: inamedbound !< flag indicating if boundnames are defined for the boundary entries
1784  character(len=LENBOUNDNAME), dimension(:), contiguous :: boundname !< bound names
1785  integer(I4B), dimension(:), optional, intent(in) :: imap !< mapping array
1786  ! -- local
1787  character(len=20) :: nodestr
1788  integer(I4B) :: nodeu
1789  integer(I4B) :: maxrows
1790  integer(I4B) :: i
1791  integer(I4B) :: node
1792  integer(I4B) :: n2
1793  integer(I4B) :: ibinun
1794  integer(I4B) :: nboundcount
1795  real(dp) :: rrate
1796  real(dp), dimension(naux) :: auxrow
1797  ! -- for observations
1798  character(len=LENBOUNDNAME) :: bname
1799  !
1800  ! -- set table kstp and kper
1801  if (iprflow /= 0) then
1802  call outputtab%set_kstpkper(kstp, kper)
1803  end if
1804  !
1805  ! -- set maxrows
1806  maxrows = 0
1807  if (ibudfl /= 0 .and. iprflow /= 0) then
1808  do i = 1, nbound
1809  node = nodelist(i)
1810  if (node > 0) then
1811  maxrows = maxrows + 1
1812  end if
1813  end do
1814  if (maxrows > 0) then
1815  call outputtab%set_maxbound(maxrows)
1816  end if
1817  call outputtab%set_title(title)
1818  end if
1819  !
1820  ! -- Set unit number for binary output
1821  if (ipakcb < 0) then
1822  ibinun = icbcun
1823  else if (ipakcb == 0) then
1824  ibinun = 0
1825  else
1826  ibinun = ipakcb
1827  end if
1828  if (icbcfl == 0) then
1829  ibinun = 0
1830  end if
1831  !
1832  ! -- If cell-by-cell flows will be saved as a list, write header.
1833  if (ibinun /= 0) then
1834  !
1835  ! -- Count nbound as the number of entries with node > 0
1836  ! SFR, for example, can have a 'none' connection, which
1837  ! means it should be excluded from budget file
1838  nboundcount = 0
1839  do i = 1, nbound
1840  node = nodelist(i)
1841  if (node > 0) nboundcount = nboundcount + 1
1842  end do
1843  call dis%record_srcdst_list_header(text, textmodel, textpackage, &
1844  dstmodel, dstpackage, naux, &
1845  auxname, ibinun, nboundcount, iout)
1846  end if
1847  !
1848  ! -- If no boundaries, skip flow calculations.
1849  if (nbound > 0) then
1850  !
1851  ! -- Loop through each boundary calculating flow.
1852  do i = 1, nbound
1853  node = nodelist(i)
1854  ! -- assign boundary name
1855  if (inamedbound > 0) then
1856  bname = boundname(i)
1857  else
1858  bname = ''
1859  end if
1860  !
1861  ! -- If cell is no-flow or constant-head, then ignore it.
1862  rrate = dzero
1863  if (node > 0) then
1864  !
1865  ! -- Use simval, which was calculated in cq()
1866  rrate = flow(i)
1867  !
1868  ! -- Print the individual rates if the budget is being printed
1869  ! and PRINT_FLOWS was specified (iprflow < 0). Rates are
1870  ! printed even if ibound < 1.
1871  if (ibudfl /= 0) then
1872  if (iprflow /= 0) then
1873  !
1874  ! -- set nodestr and write outputtab table
1875  nodeu = dis%get_nodeuser(node)
1876  call dis%nodeu_to_string(nodeu, nodestr)
1877  call outputtab%print_list_entry(i, trim(adjustl(nodestr)), &
1878  rrate, bname)
1879  end if
1880  end if
1881  !
1882  ! -- If saving cell-by-cell flows in list, write flow
1883  if (ibinun /= 0) then
1884  n2 = i
1885  if (present(imap)) n2 = imap(i)
1886  if (naux > 0) then
1887  auxrow(:) = auxvar(:, i)
1888  end if
1889  call dis%record_mf6_list_entry(ibinun, node, n2, rrate, naux, &
1890  auxrow, olconv2=.false.)
1891  end if
1892  end if
1893  !
1894  end do
1895  if (ibudfl /= 0) then
1896  if (iprflow /= 0) then
1897  write (iout, '(1x)')
1898  end if
1899  end if
1900 
1901  end if
1902  end subroutine save_print_model_flows
1903 
1904  !> @brief Activate viscosity terms
1905  !!
1906  !! Method to activate addition of viscosity terms when package type
1907  !! is DRN, GHB, or RIV (method not needed by other packages at this point)
1908  !<
1909  subroutine bnd_activate_viscosity(this)
1910  ! -- modules
1912  ! -- dummy
1913  class(bndtype), intent(inout) :: this !< BndType object
1914  ! -- local
1915  integer(I4B) :: i
1916  !
1917  ! -- Set ivsc and reallocate viscratios to be of size MAXBOUND
1918  this%ivsc = 1
1919  !
1920  ! -- Allocate array for storing user-specified conductances
1921  ! modified by updated viscosity values
1922  call mem_reallocate(this%condinput, this%maxbound, 'CONDINPUT', &
1923  this%memoryPath)
1924  do i = 1, this%maxbound
1925  this%condinput(i) = dzero
1926  end do
1927  !
1928  ! -- Notify user via listing file viscosity accounted for by standard
1929  ! boundary package.
1930  write (this%iout, '(/1x,a,a)') 'VISCOSITY ACTIVE IN ', &
1931  trim(this%filtyp)//' PACKAGE CALCULATIONS: '//trim(adjustl(this%packName))
1932  end subroutine bnd_activate_viscosity
1933 
1934 end module bndmodule
This module contains block parser methods.
Definition: BlockParser.f90:7
This module contains the base boundary package.
subroutine bnd_read_dimensions(this)
@ brief Read dimensions for package
logical(lgp) function bnd_obs_supported(this)
Determine if observations are supported.
subroutine bnd_ar(this)
@ brief Allocate and read method for boundary package
subroutine bnd_rp(this)
@ brief Allocate and read method for package
subroutine allocate_scalars(this)
@ brief Allocate package scalars
subroutine bnd_ot_dv(this, idvsave, idvprint)
@ brief Output advanced package dependent-variable terms.
subroutine bnd_store_user_cond(this, nlist, rlist, condinput)
@ brief Store user-specified conductances when vsc is active
subroutine bnd_ot_obs(this)
Output observations for the package.
subroutine bnd_nur(this, neqpak, x, xtemp, dx, inewtonur, dxmax, locmax)
@ brief Apply Newton-Raphson under-relaxation for package.
subroutine bnd_ot_package_flows(this, icbcfl, ibudfl)
@ brief Output advanced package flow terms.
subroutine bnd_read_options(this)
@ brief Read additional options for package
subroutine bnd_ot_model_flows(this, icbcfl, ibudfl, icbcun, imap)
@ brief Output package flow terms.
subroutine bnd_cc(this, innertot, kiter, iend, icnvgmod, cpak, ipak, dpak)
@ brief Convergence check for package.
subroutine bnd_rp_ts(this)
Assign time series links for the package.
subroutine bnd_bd_obs(this)
Save observations for the package.
subroutine bnd_options(this, option, found)
@ brief Read additional options for package
subroutine bnd_da(this)
@ brief Deallocate package memory
subroutine bnd_bd(this, model_budget)
@ brief Add package flows to model budget.
subroutine, public addbndtolist(list, bnd)
Add boundary to package list.
subroutine bnd_cq_simrate(this, hnew, flowja, imover)
@ brief Calculate simrate.
subroutine bnd_mc(this, moffset, matrix_sln)
@ brief Map boundary package connection to matrix
class(bndtype) function, pointer, public getbndfromlist(list, idx)
Get boundary from package list.
subroutine bnd_fc(this, rhs, ia, idxglo, matrix_sln)
@ brief Copy hcof and rhs terms into solution.
subroutine allocate_arrays(this, nodelist, auxvar)
@ brief Allocate package arrays
subroutine bnd_ck(this)
@ brief Check boundary package period data
subroutine pak_setup_outputtab(this)
@ brief Setup output table for package
subroutine bnd_ac(this, moffset, sparse)
@ brief Add boundary package connection to matrix
subroutine bnd_ot_bdsummary(this, kstp, kper, iout, ibudfl)
@ brief Output advanced package budget summary.
subroutine copy_boundname(this)
@ brief Copy boundnames into boundnames_cst
subroutine bnd_df_obs(this)
Define the observation types available in the package.
subroutine bnd_reset(this)
@ brief Reset bnd package before formulating
subroutine bnd_activate_viscosity(this)
Activate viscosity terms.
subroutine bnd_cq_simtomvr(this, flowja)
@ brief Calculate flow to the mover.
subroutine bnd_read_initial_attr(this)
@ brief Read initial parameters for package
subroutine, public save_print_model_flows(icbcfl, ibudfl, icbcun, iprflow, outputtab, nbound, nodelist, flow, ibound, title, text, ipakcb, dis, naux, textmodel, textpackage, dstmodel, dstpackage, auxname, auxvar, iout, inamedbound, boundname, imap)
Save and/or print flows for a package.
subroutine set_pointers(this, neq, ibound, xnew, xold, flowja)
@ brief Set pointers to model variables
subroutine bnd_rp_obs(this)
Read and prepare observations for a package.
subroutine bnd_cf(this)
@ brief Formulate the package hcof and rhs terms.
subroutine bnd_fn(this, rhs, ia, idxglo, matrix_sln)
@ brief Add Newton-Raphson terms for package into solution.
subroutine bnd_ad(this)
@ brief Advance the boundary package
class(bndtype) function, pointer, private castasbndclass(obj)
Cast as a boundary type.
subroutine bnd_cq(this, x, flowja, iadv)
@ brief Calculate advanced package flows.
subroutine define_listlabel(this)
@ brief Define the list label for the package
subroutine pack_initialize(this)
@ brief Allocate and initialize select package members
subroutine bnd_df(this, neq, dis)
@ brief Define boundary package options and dimensions
This module contains the BudgetModule.
Definition: Budget.f90:20
subroutine, public rate_accumulator(flow, rin, rout)
@ brief Rate accumulator subroutine
Definition: Budget.f90:632
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 lenmodelname
maximum length of the model name
Definition: Constants.f90:22
integer(i4b), parameter lenpackagename
maximum length of the package name
Definition: Constants.f90:23
real(dp), parameter dnodata
real no data constant
Definition: Constants.f90:95
integer(i4b), parameter lenlistlabel
maximum length of a llist label
Definition: Constants.f90:46
integer(i4b), parameter lenpakloc
maximum length of a package location
Definition: Constants.f90:50
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
integer(i4b), parameter maxcharlen
maximum length of char string
Definition: Constants.f90:47
integer(i4b), parameter lenmempath
maximum length of the memory path
Definition: Constants.f90:27
real(dp), parameter done
real constant 1
Definition: Constants.f90:76
subroutine, public urdaux(naux, inunit, iout, lloc, istart, istop, auxname, line, text)
Read auxiliary variables from an input line.
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
character(len=lenmempath) function create_mem_path(component, subcomponent, context)
returns the path to the memory object
This module contains the base numerical package type.
This module contains the derived types ObserveType and ObsDataType.
Definition: Observe.f90:15
This module contains the derived type ObsType.
Definition: Obs.f90:127
subroutine, public obs_cr(obs, inobs)
@ brief Create a new ObsType object
Definition: Obs.f90:225
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
real(dp), pointer, public totimc
simulation time at start of time step
Definition: tdis.f90:33
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
integer(i4b), pointer, public nper
number of stress period
Definition: tdis.f90:21
subroutine, public tasmanager_cr(this, dis, modelname, iout)
Create the time-array series manager.
subroutine, public tsmanager_cr(this, iout, removeTsLinksOnCompletion, extendTsToEndOfSimulation)
Create the tsmanager.
@ brief BndType
Derived type for the Budget object.
Definition: Budget.f90:39
This class is used to store a single deferred-length character string. It was designed to work in an ...
Definition: CharString.f90:23
A generic heterogeneous doubly-linked list.
Definition: List.f90:14