MODFLOW 6  version 6.5.0.dev2
MODFLOW 6 Code Documentation
arrayreadersmodule::readarray Interface Reference
Collaboration diagram for arrayreadersmodule::readarray:
Collaboration graph

Private Member Functions

subroutine read_array_int1d (iu, iarr, aname, ndim, jj, iout, k)
 
subroutine read_array_int2d (iu, iarr, aname, ndim, jj, ii, iout, k)
 
subroutine read_array_int3d (iu, iarr, aname, ndim, ncol, nrow, nlay, iout, k1, k2)
 
subroutine read_array_dbl1d (iu, darr, aname, ndim, jj, iout, k)
 
subroutine read_array_dbl2d (iu, darr, aname, ndim, jj, ii, iout, k)
 
subroutine read_array_dbl3d (iu, darr, aname, ndim, ncol, nrow, nlay, iout, k1, k2)
 
subroutine read_array_dbl1d_layered (iu, darr, aname, ndim, ncol, nrow, nlay, nval, iout, k1, k2)
 
subroutine read_array_int1d_layered (iu, iarr, aname, ndim, ncol, nrow, nlay, nval, iout, k1, k2)
 
subroutine read_array_dbl3d_all (iu, darr, aname, ndim, nvals, iout)
 
subroutine read_array_int3d_all (iu, iarr, aname, ndim, nvals, iout)
 

Detailed Description

Definition at line 20 of file ArrayReaders.f90.

Member Function/Subroutine Documentation

◆ read_array_dbl1d()

subroutine arrayreadersmodule::readarray::read_array_dbl1d ( integer(i4b), intent(in)  iu,
real(dp), dimension(jj), intent(inout)  darr,
character(len=*), intent(in)  aname,
integer(i4b), intent(in)  ndim,
integer(i4b), intent(in)  jj,
integer(i4b), intent(in)  iout,
integer(i4b), intent(in)  k 
)
private

Definition at line 312 of file ArrayReaders.f90.

313  ! -- dummy
314  integer(I4B), intent(in) :: iu, iout
315  integer(I4B), intent(in) :: jj
316  real(DP), dimension(jj), intent(inout) :: darr
317  character(len=*), intent(in) :: aname
318  integer(I4B), intent(in) :: ndim ! dis%ndim
319  integer(I4B), intent(in) :: k ! layer number; 0 to not print
320  ! -- local
321  logical(LGP) :: isok
322  integer(I4B) :: j, iclose, iprn, locat, ncpl, ndig
323  real(DP) :: cnstnt
324  logical :: prowcolnum
325  character(len=100) :: prfmt
326  integer(I4B) :: istat
327  integer(I4B) :: nvalt, nval
328  character(len=30) :: arrname
329  character(len=MAXCHARLEN) :: ermsgr
330  ! -- formats
331 2 format(/, 1x, a, ' = ', g14.7, ' FOR LAYER ', i0)
332 3 format(/, 1x, a, ' = ', g14.7)
333  !
334  ! -- Read array control record.
335  call read_control_dbl(iu, iout, aname, locat, cnstnt, iclose, iprn)
336  !
337  ! -- Read or assign array data.
338  if (locat == 0) then
339  ! -- Assign constant
340  do j = 1, jj
341  darr(j) = cnstnt
342  end do
343  if (iout > 0) then
344  if (k > 0) then
345  write (iout, 2) trim(aname), cnstnt, k
346  else
347  write (iout, 3) trim(aname), cnstnt
348  end if
349  end if
350  elseif (locat > 0) then
351  ! -- Read data as text
352  read (locat, *, iostat=istat, iomsg=ermsgr) (darr(j), j=1, jj)
353  if (istat /= 0) then
354  arrname = adjustl(aname)
355  errmsg = "Error reading data for array '"// &
356  trim(adjustl(arrname))//"'. "//trim(adjustl(ermsgr))
357  call store_error(errmsg)
358  call store_error_unit(locat)
359  end if
360  do j = 1, jj
361  darr(j) = darr(j) * cnstnt
362  end do
363  if (iclose == 1) then
364  close (locat)
365  end if
366  else
367  ! -- Read data as binary
368  locat = -locat
369  nvalt = 0
370  do
371  call read_binary_header(locat, iout, aname, nval)
372  isok = check_binary_size(nval, nvalt, size(darr), aname, locat)
373  if (isok .EQV. .false.) exit
374  read (locat, iostat=istat, iomsg=ermsgr) &
375  (darr(j), j=nvalt + 1, nvalt + nval)
376  if (istat /= 0) then
377  arrname = adjustl(aname)
378  errmsg = "Error reading data for array '"// &
379  trim(adjustl(arrname))//"'. "//trim(adjustl(ermsgr))
380  call store_error(errmsg)
381  call store_error_unit(locat)
382  end if
383  nvalt = nvalt + nval
384  if (nvalt == size(darr)) exit
385  end do
386  !
387  ! -- multiply entire array by constant
388  do j = 1, jj
389  darr(j) = darr(j) * cnstnt
390  end do
391  !
392  ! -- close the file
393  if (iclose == 1) then
394  close (locat)
395  end if
396  end if
397  !
398  ! -- Print array if requested.
399  if (iprn >= 0 .and. locat /= 0) then
400  prowcolnum = (ndim == 3)
401  call build_format_dbl(iprn, prfmt, prowcolnum, ncpl, ndig)
402  call print_array_dbl(darr, aname, iout, jj, 1, k, prfmt, ncpl, ndig, &
403  prowcolnum)
404  end if
405  !
406  return
Here is the call graph for this function:

◆ read_array_dbl1d_layered()

subroutine arrayreadersmodule::readarray::read_array_dbl1d_layered ( integer(i4b), intent(in)  iu,
real(dp), dimension(nval), intent(inout)  darr,
character(len=*), intent(in)  aname,
integer(i4b), intent(in)  ndim,
integer(i4b), intent(in)  ncol,
integer(i4b), intent(in)  nrow,
integer(i4b), intent(in)  nlay,
integer(i4b), intent(in)  nval,
integer(i4b), intent(in)  iout,
integer(i4b), intent(in)  k1,
integer(i4b), intent(in)  k2 
)
private

Definition at line 559 of file ArrayReaders.f90.

561  ! -- dummy
562  integer(I4B), intent(in) :: iu, iout
563  integer(I4B), intent(in) :: ncol, nrow, nlay, nval
564  real(DP), dimension(nval), intent(inout) :: darr
565  character(len=*), intent(in) :: aname
566  integer(I4B), intent(in) :: ndim ! dis%ndim
567  integer(I4B), intent(in) :: k1, k2
568  ! -- local
569  !
570  call read_array_dbl3d(iu, darr, aname, ndim, ncol, nrow, nlay, iout, k1, k2)
571  !
572  return
Here is the call graph for this function:

◆ read_array_dbl2d()

subroutine arrayreadersmodule::readarray::read_array_dbl2d ( integer(i4b), intent(in)  iu,
real(dp), dimension(jj, ii), intent(inout)  darr,
character(len=*), intent(in)  aname,
integer(i4b), intent(in)  ndim,
integer(i4b), intent(in)  jj,
integer(i4b), intent(in)  ii,
integer(i4b), intent(in)  iout,
integer(i4b), intent(in)  k 
)
private

Definition at line 409 of file ArrayReaders.f90.

410  ! -- dummy
411  integer(I4B), intent(in) :: iu, iout
412  integer(I4B), intent(in) :: jj, ii
413  real(DP), dimension(jj, ii), intent(inout) :: darr
414  character(len=*), intent(in) :: aname
415  integer(I4B), intent(in) :: ndim ! dis%ndim
416  integer(I4B), intent(in) :: k ! layer number; 0 to not print
417  ! -- local
418  logical(LGP) :: isok
419  integer(I4B) :: i, iclose, iprn, j, locat, ncpl, ndig
420  integer(I4B) :: nval
421  real(DP) :: cnstnt
422  logical :: prowcolnum
423  character(len=100) :: prfmt
424  integer(I4B) :: istat
425  character(len=30) :: arrname
426  character(len=MAXCHARLEN) :: ermsgr
427  ! -- formats
428 2 format(/, 1x, a, ' = ', g14.7, ' FOR LAYER ', i0)
429 3 format(/, 1x, a, ' = ', g14.7)
430  !
431  ! -- Read array control record.
432  call read_control_dbl(iu, iout, aname, locat, cnstnt, iclose, iprn)
433  !
434  ! -- Read or assign array data.
435  if (locat == 0) then
436  ! -- Assign constant
437  do i = 1, ii
438  do j = 1, jj
439  darr(j, i) = cnstnt
440  end do
441  end do
442  if (iout > 0) then
443  if (k > 0) then
444  write (iout, 2) trim(aname), cnstnt, k
445  else
446  write (iout, 3) trim(aname), cnstnt
447  end if
448  end if
449  elseif (locat > 0) then
450  ! -- Read data as text
451  do i = 1, ii
452  read (locat, *, iostat=istat, iomsg=ermsgr) (darr(j, i), j=1, jj)
453  if (istat /= 0) then
454  arrname = adjustl(aname)
455  errmsg = "Error reading data for array '"// &
456  trim(adjustl(arrname))//"'. "//trim(adjustl(ermsgr))
457  call store_error(errmsg)
458  call store_error_unit(locat)
459  end if
460  do j = 1, jj
461  darr(j, i) = darr(j, i) * cnstnt
462  end do
463  end do
464  if (iclose == 1) then
465  close (locat)
466  end if
467  else
468  ! -- Read data as binary
469  locat = -locat
470  call read_binary_header(locat, iout, aname, nval)
471  isok = check_binary_size(nval, 0, size(darr), aname, locat)
472  if (isok) then
473  do i = 1, ii
474  read (locat, iostat=istat, iomsg=ermsgr) (darr(j, i), j=1, jj)
475  if (istat /= 0) then
476  arrname = adjustl(aname)
477  errmsg = "Error reading data for array '"// &
478  trim(adjustl(arrname))//"'. "//trim(adjustl(ermsgr))
479  call store_error(errmsg)
480  call store_error_unit(locat)
481  end if
482  do j = 1, jj
483  darr(j, i) = darr(j, i) * cnstnt
484  end do
485  end do
486  end if
487  if (iclose == 1) then
488  close (locat)
489  end if
490  end if
491  !
492  ! -- Print array if requested.
493  if (iprn >= 0 .and. locat /= 0) then
494  prowcolnum = (ndim == 3)
495  call build_format_dbl(iprn, prfmt, prowcolnum, ncpl, ndig)
496  call print_array_dbl(darr, aname, iout, jj, ii, k, prfmt, ncpl, &
497  ndig, prowcolnum)
498  end if
499  !
500  return
Here is the call graph for this function:

◆ read_array_dbl3d()

subroutine arrayreadersmodule::readarray::read_array_dbl3d ( integer(i4b), intent(in)  iu,
real(dp), dimension(ncol, nrow, nlay), intent(inout)  darr,
character(len=*), intent(in)  aname,
integer(i4b), intent(in)  ndim,
integer(i4b), intent(in)  ncol,
integer(i4b), intent(in)  nrow,
integer(i4b), intent(in)  nlay,
integer(i4b), intent(in)  iout,
integer(i4b), intent(in)  k1,
integer(i4b), intent(in)  k2 
)
private

Definition at line 503 of file ArrayReaders.f90.

505 ! ******************************************************************************
506 ! Read three-dimensional real array, consisting of one or more 2d arrays with
507 ! array control records.
508 ! ******************************************************************************
509 !
510 ! SPECIFICATIONS:
511 ! ------------------------------------------------------------------------------
512  integer(I4B), intent(in) :: iu
513  integer(I4B), intent(in) :: iout
514  integer(I4B), intent(in) :: ndim
515  integer(I4B), intent(in) :: ncol
516  integer(I4B), intent(in) :: nrow
517  integer(I4B), intent(in) :: nlay
518  integer(I4B), intent(in) :: k1, k2
519  real(DP), dimension(ncol, nrow, nlay), intent(inout) :: darr
520  character(len=*), intent(in) :: aname
521  ! -- local
522  integer(I4B) :: k, kk
523 ! ------------------------------------------------------------------------------
524  !
525  do k = k1, k2
526  if (k <= 0) then
527  kk = 1
528  else
529  kk = k
530  end if
531  call read_array_dbl2d(iu, darr(:, :, kk), aname, ndim, ncol, nrow, iout, k)
532  end do
533  !
534  return
Here is the call graph for this function:

◆ read_array_dbl3d_all()

subroutine arrayreadersmodule::readarray::read_array_dbl3d_all ( integer(i4b), intent(in)  iu,
real(dp), dimension(nvals, 1, 1), intent(inout)  darr,
character(len=*), intent(in)  aname,
integer(i4b), intent(in)  ndim,
integer(i4b), intent(in)  nvals,
integer(i4b), intent(in)  iout 
)
private

Definition at line 537 of file ArrayReaders.f90.

538 ! ******************************************************************************
539 ! Read three-dimensional real array, consisting of one or more 2d arrays with
540 ! array control records.
541 ! ******************************************************************************
542 !
543 ! SPECIFICATIONS:
544 ! ------------------------------------------------------------------------------
545  integer(I4B), intent(in) :: iu
546  integer(I4B), intent(in) :: iout
547  integer(I4B), intent(in) :: ndim
548  integer(I4B), intent(in) :: nvals
549  real(DP), dimension(nvals, 1, 1), intent(inout) :: darr
550  character(len=*), intent(in) :: aname
551  ! -- local
552 ! ------------------------------------------------------------------------------
553  !
554  call read_array_dbl1d(iu, darr, aname, ndim, nvals, iout, 0)
555  !
556  return
Here is the call graph for this function:

◆ read_array_int1d()

subroutine arrayreadersmodule::readarray::read_array_int1d ( integer(i4b), intent(in)  iu,
integer(i4b), dimension(jj), intent(inout)  iarr,
character(len=*), intent(in)  aname,
integer(i4b), intent(in)  ndim,
integer(i4b), intent(in)  jj,
integer(i4b), intent(in)  iout,
integer(i4b), intent(in)  k 
)
private

Definition at line 52 of file ArrayReaders.f90.

53  ! -- dummy
54  integer(I4B), intent(in) :: iu, iout
55  integer(I4B), intent(in) :: jj
56  integer(I4B), dimension(jj), intent(inout) :: iarr
57  character(len=*), intent(in) :: aname
58  integer(I4B), intent(in) :: ndim ! dis%ndim
59  integer(I4B), intent(in) :: k ! layer number; 0 to not print
60  ! -- local
61  logical(LGP) :: isok
62  integer(I4B) :: iclose, iconst, iprn, j, locat, ncpl, ndig
63  integer(I4B) :: nval, nvalt
64  logical :: prowcolnum
65  character(len=100) :: prfmt
66  integer(I4B) :: istat
67  character(len=30) :: arrname
68  character(len=MAXCHARLEN) :: ermsgr
69  ! -- formats
70 2 format(/, 1x, a, ' = ', i0, ' FOR LAYER ', i0)
71 3 format(/, 1x, a, ' = ', i0)
72  !
73  ! -- Read array control record.
74  call read_control_int(iu, iout, aname, locat, iconst, iclose, iprn)
75  !
76  ! -- Read or assign array data.
77  if (locat == 0) then
78  ! -- Assign constant
79  do j = 1, jj
80  iarr(j) = iconst
81  end do
82  if (iout > 0) then
83  if (k > 0) then
84  write (iout, 2) trim(aname), iconst, k
85  else
86  write (iout, 3) trim(aname), iconst
87  end if
88  end if
89  elseif (locat > 0) then
90  ! -- Read data as text
91  read (locat, *, iostat=istat, iomsg=ermsgr) (iarr(j), j=1, jj)
92  if (istat /= 0) then
93  arrname = adjustl(aname)
94  errmsg = "Error reading data for array '"//trim(arrname)// &
95  "'. "//trim(adjustl(ermsgr))
96  call store_error(errmsg)
97  call store_error_unit(locat)
98  end if
99  do j = 1, jj
100  iarr(j) = iarr(j) * iconst
101  end do
102  if (iclose == 1) then
103  close (locat)
104  end if
105  else
106  ! -- Read data as binary
107  locat = -locat
108  nvalt = 0
109  do
110  call read_binary_header(locat, iout, aname, nval)
111  isok = check_binary_size(nval, nvalt, size(iarr), aname, locat)
112  if (isok .EQV. .false.) exit
113  read (locat, iostat=istat, iomsg=ermsgr) &
114  (iarr(j), j=nvalt + 1, nvalt + nval)
115  if (istat /= 0) then
116  arrname = adjustl(aname)
117  errmsg = "Error reading data for array '"//trim(arrname)// &
118  "'. "//trim(adjustl(ermsgr))
119  call store_error(errmsg)
120  call store_error_unit(locat)
121  end if
122  nvalt = nvalt + nval
123  if (nvalt == size(iarr)) exit
124  end do
125  !
126  ! -- multiply array by constant
127  do j = 1, jj
128  iarr(j) = iarr(j) * iconst
129  end do
130  !
131  ! -- close the file
132  if (iclose == 1) then
133  close (locat)
134  end if
135  end if
136  !
137  ! -- Print array if requested.
138  if (iprn >= 0 .and. locat /= 0) then
139  prowcolnum = (ndim == 3)
140  call build_format_int(iprn, prfmt, prowcolnum, ncpl, ndig)
141  call print_array_int(iarr, aname, iout, jj, 1, k, prfmt, ncpl, ndig, &
142  prowcolnum)
143  end if
144  !
145  return
Here is the call graph for this function:

◆ read_array_int1d_layered()

subroutine arrayreadersmodule::readarray::read_array_int1d_layered ( integer(i4b), intent(in)  iu,
integer(i4b), dimension(nval), intent(inout)  iarr,
character(len=*), intent(in)  aname,
integer(i4b), intent(in)  ndim,
integer(i4b), intent(in)  ncol,
integer(i4b), intent(in)  nrow,
integer(i4b), intent(in)  nlay,
integer(i4b), intent(in)  nval,
integer(i4b), intent(in)  iout,
integer(i4b), intent(in)  k1,
integer(i4b), intent(in)  k2 
)
private

Definition at line 294 of file ArrayReaders.f90.

296  ! -- dummy
297  integer(I4B), intent(in) :: iu, iout
298  integer(I4B), intent(in) :: ncol, nrow, nlay, nval
299  integer(I4B), dimension(nval), intent(inout) :: iarr
300  character(len=*), intent(in) :: aname
301  integer(I4B), intent(in) :: ndim ! dis%ndim
302  integer(I4B), intent(in) :: k1, k2
303  ! -- local
304  !
305  call read_array_int3d(iu, iarr, aname, ndim, ncol, nrow, nlay, iout, k1, k2)
306  !
307  return
Here is the call graph for this function:

◆ read_array_int2d()

subroutine arrayreadersmodule::readarray::read_array_int2d ( integer(i4b), intent(in)  iu,
integer(i4b), dimension(jj, ii), intent(inout)  iarr,
character(len=*), intent(in)  aname,
integer(i4b), intent(in)  ndim,
integer(i4b), intent(in)  jj,
integer(i4b), intent(in)  ii,
integer(i4b), intent(in)  iout,
integer(i4b), intent(in)  k 
)
private

Definition at line 148 of file ArrayReaders.f90.

149  ! -- dummy
150  integer(I4B), intent(in) :: iu, iout
151  integer(I4B), intent(in) :: jj, ii
152  integer(I4B), dimension(jj, ii), intent(inout) :: iarr
153  character(len=*), intent(in) :: aname
154  integer(I4B), intent(in) :: ndim ! dis%ndim
155  integer(I4B), intent(in) :: k ! layer number; 0 to not print
156  ! -- local
157  logical(LGP) :: isok
158  integer(I4B) :: i, iclose, iconst, iprn, j, locat, ncpl, ndig
159  integer(I4B) :: nval
160  logical :: prowcolnum
161  character(len=100) :: prfmt
162  integer(I4B) :: istat
163  character(len=30) :: arrname
164  character(len=MAXCHARLEN) :: ermsgr
165  ! -- formats
166 2 format(/, 1x, a, ' = ', i0, ' FOR LAYER ', i0)
167 3 format(/, 1x, a, ' = ', i0)
168  !
169  ! -- Read array control record.
170  call read_control_int(iu, iout, aname, locat, iconst, iclose, iprn)
171  !
172  ! -- Read or assign array data.
173  if (locat == 0) then
174  ! -- Assign constant
175  do i = 1, ii
176  do j = 1, jj
177  iarr(j, i) = iconst
178  end do
179  end do
180  if (iout > 0) then
181  if (k > 0) then
182  write (iout, 2) trim(aname), iconst, k
183  else
184  write (iout, 3) trim(aname), iconst
185  end if
186  end if
187  elseif (locat > 0) then
188  ! -- Read data as text
189  do i = 1, ii
190  read (locat, *, iostat=istat, iomsg=ermsgr) (iarr(j, i), j=1, jj)
191  if (istat /= 0) then
192  arrname = adjustl(aname)
193  errmsg = "Error reading data for array '"//trim(arrname)// &
194  "'. "//trim(adjustl(ermsgr))
195  call store_error(errmsg)
196  call store_error_unit(locat)
197  end if
198  do j = 1, jj
199  iarr(j, i) = iarr(j, i) * iconst
200  end do
201  end do
202  if (iclose == 1) then
203  close (locat)
204  end if
205  else
206  ! -- Read data as binary
207  locat = -locat
208  call read_binary_header(locat, iout, aname, nval)
209  isok = check_binary_size(nval, 0, size(iarr), aname, locat)
210  if (isok) then
211  do i = 1, ii
212  read (locat, iostat=istat, iomsg=ermsgr) (iarr(j, i), j=1, jj)
213  if (istat /= 0) then
214  arrname = adjustl(aname)
215  errmsg = "Error reading data for array '"//trim(arrname)// &
216  "'. "//trim(adjustl(ermsgr))
217  call store_error(errmsg)
218  call store_error_unit(locat)
219  end if
220  do j = 1, jj
221  iarr(j, i) = iarr(j, i) * iconst
222  end do
223  end do
224  end if
225  if (iclose == 1) then
226  close (locat)
227  end if
228  end if
229  !
230  ! -- Print array if requested.
231  if (iprn >= 0 .and. locat /= 0) then
232  prowcolnum = (ndim == 3)
233  call build_format_int(iprn, prfmt, prowcolnum, ncpl, ndig)
234  call print_array_int(iarr, aname, iout, jj, ii, k, prfmt, ncpl, &
235  ndig, prowcolnum)
236  end if
237  !
238  return
Here is the call graph for this function:

◆ read_array_int3d()

subroutine arrayreadersmodule::readarray::read_array_int3d ( integer(i4b), intent(in)  iu,
integer(i4b), dimension(ncol, nrow, nlay), intent(inout)  iarr,
character(len=*), intent(in)  aname,
integer(i4b), intent(in)  ndim,
integer(i4b), intent(in)  ncol,
integer(i4b), intent(in)  nrow,
integer(i4b), intent(in)  nlay,
integer(i4b), intent(in)  iout,
integer(i4b), intent(in)  k1,
integer(i4b), intent(in)  k2 
)
private

Definition at line 241 of file ArrayReaders.f90.

243 ! ******************************************************************************
244 ! Read three-dimensional integer array, consisting of one or more 2d arrays with
245 ! array control records.
246 ! ******************************************************************************
247 !
248 ! SPECIFICATIONS:
249 ! ------------------------------------------------------------------------------
250  integer(I4B), intent(in) :: iu
251  integer(I4B), intent(in) :: iout
252  integer(I4B), intent(in) :: ndim
253  integer(I4B), intent(in) :: ncol
254  integer(I4B), intent(in) :: nrow
255  integer(I4B), intent(in) :: nlay
256  integer(I4B), intent(in) :: k1, k2
257  integer(I4B), dimension(ncol, nrow, nlay), intent(inout) :: iarr
258  character(len=*), intent(in) :: aname
259  ! -- local
260  integer(I4B) :: k, kk
261 ! ------------------------------------------------------------------------------
262  do k = k1, k2
263  if (k <= 0) then
264  kk = 1
265  else
266  kk = k
267  end if
268  call read_array_int2d(iu, iarr(:, :, kk), aname, ndim, ncol, nrow, iout, k)
269  end do
270  return
Here is the call graph for this function:

◆ read_array_int3d_all()

subroutine arrayreadersmodule::readarray::read_array_int3d_all ( integer(i4b), intent(in)  iu,
integer(i4b), dimension(nvals, 1, 1), intent(inout)  iarr,
character(len=*), intent(in)  aname,
integer(i4b), intent(in)  ndim,
integer(i4b), intent(in)  nvals,
integer(i4b), intent(in)  iout 
)
private

Definition at line 273 of file ArrayReaders.f90.

274 ! ******************************************************************************
275 ! Read three-dimensional integer array, all at once.
276 ! ******************************************************************************
277 !
278 ! SPECIFICATIONS:
279 ! ------------------------------------------------------------------------------
280  integer(I4B), intent(in) :: iu
281  integer(I4B), intent(in) :: iout
282  integer(I4B), intent(in) :: ndim
283  integer(I4B), intent(in) :: nvals
284  integer(I4B), dimension(nvals, 1, 1), intent(inout) :: iarr
285  character(len=*), intent(in) :: aname
286  ! -- local
287 ! ------------------------------------------------------------------------------
288  !
289  call read_array_int1d(iu, iarr, aname, ndim, nvals, iout, 0)
290  !
291  return
Here is the call graph for this function:

The documentation for this interface was generated from the following file: