My Project
Data Types | Functions/Subroutines | Variables
mod_nesting Module Reference

Data Types

type  nest_data
 

Functions/Subroutines

subroutine name_list_initialize_nest
 
subroutine name_list_print_nest
 
subroutine name_list_read_nest
 
subroutine open_nesting_file
 
subroutine set_var (NOW, UA, VA, EL, U, V, S1, T1, HYW)
 
subroutine set_var_wave (NOW, HSC1, TPEAK, DIRDEG1)
 
subroutine archive_nest
 
subroutine archive_nest_wave
 
subroutine update_itime_nest (VAR1, VAR2, NOW)
 
integer function time2ncitime_nest (MJD, D, MS)
 
subroutine update_float_time_nest (VAR, NOW)
 
type(ncvar) function, pointer float_time_object_nest (use_mjd, DIM, size)
 
type(ncvar) function, pointer itime_object_nest (use_mjd, DIM, size)
 

Variables

type(grid), pointer nesting_grid
 
type(nest_data), pointer nesting_data
 
type(ncfile), pointer nesting_file
 
real(sp), dimension(:), allocatable ua_nest
 
real(sp), dimension(:), allocatable va_nest
 
real(sp), dimension(:), allocatable el_nest
 
real(sp), dimension(:,:), allocatable u_nest
 
real(sp), dimension(:,:), allocatable v_nest
 
real(sp), dimension(:,:), allocatable s1_nest
 
real(sp), dimension(:,:), allocatable t1_nest
 
real(sp), dimension(:,:), allocatable hyw_nest
 
real(sp), dimension(:,:), allocatable u_nest_l
 
real(sp), dimension(:,:), allocatable v_nest_l
 
real(sp), dimension(:,:), allocatable s1_nest_l
 
real(sp), dimension(:,:), allocatable t1_nest_l
 
real(sp), dimension(:,:), allocatable hyw_nest_l
 
real(sp), dimension(:,:), allocatable, target zz_l
 
real(sp), dimension(:,:), allocatable, target zz1_l
 
real(sp), dimension(:), allocatable, target h_l
 
real(sp), dimension(:), allocatable, target h1_l
 
real(sp), dimension(:), allocatable wcell_nest
 
real(sp), dimension(:), allocatable wnode_nest
 
type(ncvar), pointer var_ua
 
type(ncvar), pointer var_va
 
type(ncvar), pointer var_el
 
type(ncvar), pointer var_u
 
type(ncvar), pointer var_v
 
type(ncvar), pointer var_s1
 
type(ncvar), pointer var_t1
 
type(ncvar), pointer var_hyw
 
type(ncvar), pointer var_time1
 
type(ncvar), pointer var_time2
 
type(ncvar), pointer var_wcell
 
type(ncvar), pointer var_wnode
 
integer ncnest_num
 
character(len=80), dimension(:), allocatable ncnest_fnames
 
type(grid), dimension(:), pointer ncnest_grids
 
type(nest_data), dimension(:), pointer ncnest_data
 
type(time) interval_time_ncnest
 
type(time) time_interval
 
logical nesting_on
 
character(len=80) nesting_type
 
integer nesting_blocksize
 
character(len=80) nesting_file_name
 
logical ncnest_on
 
integer ncnest_blocksize
 
character(len=160) ncnest_node_files
 
character(len=80) ncnest_out_interval
 
integer kb_l
 
integer kbm1_l
 

Function/Subroutine Documentation

◆ archive_nest()

subroutine mod_nesting::archive_nest ( )

Definition at line 334 of file mod_nesting.f90.

334  IMPLICIT NONE
Here is the caller graph for this function:

◆ archive_nest_wave()

subroutine mod_nesting::archive_nest_wave ( )

Definition at line 338 of file mod_nesting.f90.

338  IMPLICIT NONE

◆ float_time_object_nest()

type(ncvar) function, pointer mod_nesting::float_time_object_nest ( logical, intent(in)  use_mjd,
type(ncdim), optional, pointer  DIM,
integer, optional  size 
)

Definition at line 421 of file mod_nesting.f90.

421  IMPLICIT NONE
422  TYPE(NCVAR), POINTER :: VAR
423  logical, intent(in) :: use_mjd
424  TYPE(NCDIM), POINTER, OPTIONAL :: DIM
425  INTEGER, OPTIONAL :: SIZE
426  TYPE(NCATT), POINTER :: ATT
427  REAL(SP),pointer :: Data_vec(:)
428  REAL(SP),pointer :: Data_scl
429 
430  IF(PRESENT(size)) THEN
431  ALLOCATE(data_vec(size))
432  ELSE
433  ALLOCATE(data_vec(1))
434  data_scl =>data_vec(1)
435  END IF
436 
437  IF (PRESENT(dim)) THEN
438  var => nc_make_pvar(name='time', values=data_vec, dim1= dim)
439  if(associated(var%vec_flt))then
440  var%scl_flt => var%vec_flt(1)
441  else
442  var%scl_dbl => var%vec_dbl(1)
443  endif
444  ELSE
445  var => nc_make_pvar(name='time', values=data_scl)
446  END IF
447 
448  att => nc_make_att(name='long_name',values='time')
449  var => add(var,att)
450 
451  IF (use_mjd) THEN
452  att => nc_make_att(name='units',values=mjd_units)
453  var => add(var,att)
454 
455  att => nc_make_att(name='format',values=fmat)
456  var => add(var,att)
457 
458  att => nc_make_att(name='time_zone',values='UTC')
459  var => add(var,att)
460 
461  ELSE
462  att => nc_make_att(name='units',values=days_units)
463  var => add(var,att)
464 
465  att => nc_make_att(name='time_zone',values='none')
466  var => add(var,att)
467  END IF
468 
469 

◆ itime_object_nest()

type(ncvar) function, pointer mod_nesting::itime_object_nest ( logical, intent(in)  use_mjd,
type(ncdim), optional, pointer  DIM,
integer, optional  size 
)

Definition at line 474 of file mod_nesting.f90.

474  IMPLICIT NONE
475  TYPE(NCVAR), POINTER :: VAR
476  logical, intent(in) :: use_mjd
477  TYPE(NCDIM), POINTER, OPTIONAL :: DIM
478  INTEGER, OPTIONAL :: SIZE
479  TYPE(NCATT), POINTER :: ATT
480  INTEGER,POINTER :: Data_vec(:)
481  INTEGER,POINTER :: Data_scl
482 
483  IF(PRESENT(size)) THEN
484  ALLOCATE(data_vec(size))
485  ELSE
486  ALLOCATE(data_vec(1))
487  data_scl =>data_vec(1)
488  END IF
489 
490  ! Itime
491  IF (PRESENT(dim)) THEN
492  var => nc_make_pvar(name='Itime', values=data_vec, dim1= dim)
493  var%SCL_INT => var%VEC_INT(1)
494  ELSE
495  var => nc_make_pvar(name='Itime', values=data_scl)
496  END IF
497 
498  IF (use_mjd) THEN
499  att => nc_make_att(name='units',values=mjd_units)
500  var => add(var,att)
501 
502  att => nc_make_att(name='format',values=fmat)
503  var => add(var,att)
504 
505  att => nc_make_att(name='time_zone',values='UTC')
506  var => add(var,att)
507  ELSE
508  att => nc_make_att(name='units',values=days_units)
509  var => add(var,att)
510 
511  att => nc_make_att(name='time_zone',values='none')
512  var => add(var,att)
513  END IF
514 

◆ name_list_initialize_nest()

subroutine mod_nesting::name_list_initialize_nest ( )

Definition at line 164 of file mod_nesting.f90.

164  USE control
165 
166  IMPLICIT NONE
167 
168  !--Parameters in NameList NML_NESTING
169  nesting_on = .false.
170  nesting_type = "'1' or '2' or '3'"
171  nesting_blocksize = -1
172  nesting_file_name = trim(casename)//"_nesting.nc"
173 
174  !--Parameters in NameList NML_NCNEST
175  ncnest_on = .false.
176  ncnest_blocksize = -1
177  ncnest_node_files = "none"
178  ncnest_out_interval = "A length of time: 'seconds= ','days= ', or 'cycles= '"
179 
180 
181  kb_l = 0
182  kbm1_l = 0
183 
184  RETURN
character(len=160) ncnest_node_files
character(len=80) casename
Definition: mod_main.f90:116
integer kb_l
logical ncnest_on
integer ncnest_blocksize
integer kbm1_l
logical nesting_on
character(len=80) nesting_file_name
integer nesting_blocksize
character(len=80) ncnest_out_interval
character(len=80) nesting_type
Here is the caller graph for this function:

◆ name_list_print_nest()

subroutine mod_nesting::name_list_print_nest ( )

Definition at line 190 of file mod_nesting.f90.

190  USE control
191 
192  IMPLICIT NONE
193 
194  WRITE(unit=ipt,nml=nml_ncnest)
195 
196  WRITE(unit=ipt,nml=nml_nesting)
197 
198 
199  RETURN
integer ipt
Definition: mod_main.f90:922

◆ name_list_read_nest()

subroutine mod_nesting::name_list_read_nest ( )

Definition at line 205 of file mod_nesting.f90.

205  USE mod_utils
206  USE control
208 
209  IMPLICIT NONE
210 
211  INTEGER :: ios,I
212  CHARACTER(LEN=120) :: FNAME
213 
214  IF(dbg_set(dbg_sbr)) write(ipt,*) "Subroutine Begins: name_list_read_nest;"
215 
216  ios = 0
217  fname = "./"//trim(casename)//"_run.nml"
218  IF(dbg_set(dbg_io)) write(ipt,*) "Get_nestpar: File: ",trim(fname)
219 
220  CALL fopen(nmlunit,trim(fname),'cfr')
221 
222  !READ NAME LIST FILE
223 
224  !READ NESTING FLAG
225  READ(unit=nmlunit, nml=nml_nesting,iostat=ios)
226  IF(ios /= 0)THEN
227  IF(dbg_set(dbg_log)) write(unit=ipt,nml=nml_nesting)
228  CALL fatal_error("Can Not Read NameList NML_NESTING from file: "//trim(fname))
229  END IF
230 
231  if(dbg_set(dbg_scl)) &
232  & write(ipt,*) "Read_Name_List:NML_NESTING"
233 
234  if(dbg_set(dbg_scl)) &
235  & write(unit=ipt,nml=nml_nesting)
236 
237  rewind(nmlunit)
238 
239  !READ NESTING FLAG
240  READ(unit=nmlunit, nml=nml_ncnest,iostat=ios)
241  IF(ios /= 0)THEN
242  IF(dbg_set(dbg_log)) write(unit=ipt,nml=nml_ncnest)
243  CALL fatal_error("Can Not Read NameList NML_NCNEST from file: "//trim(fname))
244  END IF
245 
246  if(dbg_set(dbg_scl)) &
247  & write(ipt,*) "Read_Name_List: NML_NCNEST"
248 
249  if(dbg_set(dbg_scl)) &
250  & write(unit=ipt,nml=nml_ncnest)
251 
252 
253 
254  CLOSE(nmlunit)
255 
256  ! DO SOME BASIC CHECKING ON THE NESTING NAMELIST
257  IF(nesting_on) THEN
258 
259  IF( nesting_blocksize < 2) CALL fatal_error &
260  & ("THE NESTING_BLOCKSIZE IS LESS THAN TWO IN THE NESTING NAME LIST")
261 
262  IF(len_trim(nesting_file_name) == 0 ) CALL fatal_error &
263  & ("THE NESTING FILE NAME IS EMPTY IN THE NAME LIST")
264 
265  END IF
266 
267  IF(ncnest_on) THEN
268 
269  IF( ncnest_blocksize < 2) CALL fatal_error &
270  & ("THE NCNEST_BLOCKSIZE IS LESS THAN TWO IN THE NCNEST NAME LIST")
271 
272  IF(ncnest_node_files == 'none' .or. len_trim(ncnest_node_files)==0)CALL fatal_error &
273  & ("THE NCNEST_NODE_FILES VARIABLE IS EMPTY IN THE NCNEST NAME LIST")
274 
276 
277  END IF
278 
279  CLOSE(nmlunit)
280 
281  if(dbg_set(dbg_sbr)) &
282  & write(ipt,*) "Subroutine Ends: name_list_read_nest;"
283 
character(len=160) ncnest_node_files
character(len=80) casename
Definition: mod_main.f90:116
subroutine get_output_file_interval(STRING, INTERVAL)
integer, parameter nmlunit
Definition: mod_main.f90:926
integer, parameter dbg_scl
Definition: mod_utils.f90:67
logical function dbg_set(vrb)
Definition: mod_utils.f90:182
logical ncnest_on
integer ncnest_blocksize
logical nesting_on
character(len=80) nesting_file_name
subroutine fopen(IUNIT, INSTR, IOPT)
Definition: mod_utils.f90:1577
type(time) interval_time_ncnest
subroutine fatal_error(ER1, ER2, ER3, ER4)
Definition: mod_utils.f90:230
integer nesting_blocksize
character(len=80) ncnest_out_interval
integer, parameter dbg_io
Definition: mod_utils.f90:66
integer ipt
Definition: mod_main.f90:922
integer, parameter dbg_sbr
Definition: mod_utils.f90:69
integer ios
Definition: mod_obcs2.f90:81
integer, parameter dbg_log
Definition: mod_utils.f90:65
Here is the call graph for this function:
Here is the caller graph for this function:

◆ open_nesting_file()

subroutine mod_nesting::open_nesting_file ( )

Definition at line 287 of file mod_nesting.f90.

287  IMPLICIT NONE
288  TYPE(NCFILE), POINTER :: NCF
289  integer :: charnum
290  logical :: back=.true.
291  character(len=160) :: pathnfile
292  ! LOAD NESTING NETCDF FILE
293  IF (nesting_on) THEN
294 
295  ! TEST FILE NAME
296  charnum = index(nesting_file_name,".nc",back)
297  if (charnum /= len_trim(nesting_file_name)-2)&
298  & CALL warning("Nesting File does not end in .nc", &
299  & trim(nesting_file_name))
300 
301  ! INITIALIZE TYPE TO HOLD FILE METADATA
302  pathnfile= trim(input_dir)//trim(nesting_file_name)
303  CALL nc_init(ncf,pathnfile)
304 
305  ! OPEN THE FILE AND LOAD METADATA
306  if(.not. ncf%OPEN) then
307  Call nc_open(ncf)
308  CALL nc_load(ncf)
309  filehead => add(filehead,ncf)
310  end if
311 
312  END IF
313 
logical nesting_on
character(len=80) nesting_file_name
subroutine warning(ER1, ER2, ER3, ER4)
Definition: mod_utils.f90:251
character(len=80) input_dir
Definition: mod_main.f90:183
Here is the call graph for this function:
Here is the caller graph for this function:

◆ set_var()

subroutine mod_nesting::set_var ( type(time), intent(in)  NOW,
real(sp), dimension(:), optional, allocatable  UA,
real(sp), dimension(:), optional, allocatable  VA,
real(sp), dimension(:), optional, allocatable  EL,
real(sp), dimension(:,:), optional, allocatable  U,
real(sp), dimension(:,:), optional, allocatable  V,
real(sp), dimension(:,:), optional, allocatable  S1,
real(sp), dimension(:,:), optional, allocatable  T1,
real(sp), dimension(:,:), optional, allocatable  HYW 
)

Definition at line 321 of file mod_nesting.f90.

321  IMPLICIT NONE
322  TYPE(TIME), INTENT(IN) :: NOW
323  REAL(SP), ALLOCATABLE, OPTIONAL :: UA(:),VA(:),EL(:)
324  REAL(SP), ALLOCATABLE, OPTIONAL :: U(:,:),V(:,:),S1(:,:),T1(:,:),HYW(:,:)
Here is the caller graph for this function:

◆ set_var_wave()

subroutine mod_nesting::set_var_wave ( type(time), intent(in)  NOW,
real(sp), dimension(:), optional, allocatable  HSC1,
real(sp), dimension(:), optional, allocatable  TPEAK,
real(sp), dimension(:), optional, allocatable  DIRDEG1 
)

Definition at line 328 of file mod_nesting.f90.

328  IMPLICIT NONE
329  TYPE(TIME), INTENT(IN) :: NOW
330  REAL(SP), ALLOCATABLE, OPTIONAL :: HSC1(:),TPEAK(:),DIRDEG1(:)

◆ time2ncitime_nest()

integer function mod_nesting::time2ncitime_nest ( type(time), intent(in)  MJD,
integer, intent(out)  D,
integer, intent(out)  MS 
)

Definition at line 376 of file mod_nesting.f90.

376  implicit none
377  INTEGER :: RES
378  TYPE(TIME), INTENT(IN) :: MJD
379  INTEGER, INTENT(OUT) :: D, MS
380  REAL(DP) :: MSEC
381 
382  res = -1
383  msec = dble(mjd%MuSod) / 1000.0_dp
384  ms = anint(msec)
385 
386  ! CHECK TO MAKE SURE IT IS NOT TOO LARGE
387  IF (abs(mjd%MJD) .GT. huge(d)) THEN
388  res =0
389  return
390  END IF
391 
392  d = mjd%MJD
393 
real(sp), dimension(:), allocatable, target d
Definition: mod_main.f90:1132
Here is the caller graph for this function:

◆ update_float_time_nest()

subroutine mod_nesting::update_float_time_nest ( type(ncvar), pointer  VAR,
type(time), intent(in)  NOW 
)

Definition at line 398 of file mod_nesting.f90.

398  IMPLICIT NONE
399  TYPE(NCVAR), POINTER :: VAR
400  TYPE(TIME), INTENT(in) :: NOW
401  REAL(SP), POINTER :: Data
402  LOGICAL :: TEST
403  CHARACTER(len=80):: TZONE
404 
405  test = is_valid_float_days(var,tzone)
406  IF(.not. test) THEN
407  CALL print_var(var)
408  call print_att_list(var)
409  CALL fatal_error &
410  ("CAN NOT UPDATE TIME FOR INVALID FLOATING POINT TIME VARIABLE")
411  END IF
412 
413  CALL nc_point_var(var,data)
414 
415  Data = days(now)
416 
real(dp) function days(MJD)
Definition: mod_time.f90:749
subroutine fatal_error(ER1, ER2, ER3, ER4)
Definition: mod_utils.f90:230
Here is the call graph for this function:

◆ update_itime_nest()

subroutine mod_nesting::update_itime_nest ( type(ncvar), pointer  VAR1,
type(ncvar), pointer  VAR2,
type(time), intent(in)  NOW 
)

Definition at line 344 of file mod_nesting.f90.

344  IMPLICIT NONE
345  TYPE(NCVAR), POINTER :: VAR1
346  TYPE(NCVAR), POINTER :: VAR2
347  TYPE(NCATT), POINTER :: ATT
348  TYPE(TIME), INTENT(in) :: NOW
349  INTEGER, POINTER :: D1,D2
350  LOGICAL :: TEST2
351  INTEGER :: TEST
352  CHARACTER(len=80):: TZONE
353 
354  test2 = is_valid_itime(var1,var2,tzone)
355  IF(.not. test2) THEN
356  CALL print_var(var1)
357  CALL print_var(var2)
358  CALL fatal_error &
359  ("CAN NOT UPDATE TIME FOR INVALID INTEGER TIME VARIABLES")
360  END IF
361 
362  CALL nc_point_var(var1,d1)
363 
364  CALL nc_point_var(var2,d2)
365 
366  test = time2ncitime_nest(now,d1,d2)
367 
368 ! if(.not. TEST) call fatal_error("That is bad times man!")
369  if(test==0) call fatal_error("That is bad times man!")
370  ! THIS SHOULD NEVER HAPPEN?
371 
real(sp), dimension(:), allocatable, target d1
Definition: mod_main.f90:1116
subroutine fatal_error(ER1, ER2, ER3, ER4)
Definition: mod_utils.f90:230
integer function time2ncitime_nest(MJD, D, MS)
Here is the call graph for this function:

Variable Documentation

◆ el_nest

real(sp), dimension(:), allocatable mod_nesting::el_nest

Definition at line 79 of file mod_nesting.f90.

◆ h1_l

real(sp), dimension(:), allocatable, target mod_nesting::h1_l

Definition at line 88 of file mod_nesting.f90.

◆ h_l

real(sp), dimension(:), allocatable, target mod_nesting::h_l

Definition at line 88 of file mod_nesting.f90.

◆ hyw_nest

real(sp), dimension(:,:), allocatable mod_nesting::hyw_nest

Definition at line 82 of file mod_nesting.f90.

82  REAL(SP), ALLOCATABLE :: HYW_NEST(:,:)

◆ hyw_nest_l

real(sp), dimension(:,:), allocatable mod_nesting::hyw_nest_l

Definition at line 86 of file mod_nesting.f90.

86  REAL(SP), ALLOCATABLE :: HYW_NEST_L(:,:)

◆ interval_time_ncnest

type(time) mod_nesting::interval_time_ncnest

Definition at line 119 of file mod_nesting.f90.

119  TYPE(TIME) :: INTERVAL_TIME_NCNEST, TIME_INTERVAL

◆ kb_l

integer mod_nesting::kb_l

Definition at line 156 of file mod_nesting.f90.

156  INTEGER :: KB_L

◆ kbm1_l

integer mod_nesting::kbm1_l

Definition at line 157 of file mod_nesting.f90.

157  INTEGER :: KBM1_L

◆ ncnest_blocksize

integer mod_nesting::ncnest_blocksize

Definition at line 145 of file mod_nesting.f90.

145  INTEGER :: NCNEST_BLOCKSIZE

◆ ncnest_data

type(nest_data), dimension(:), pointer mod_nesting::ncnest_data

Definition at line 114 of file mod_nesting.f90.

114  TYPE(NEST_DATA), POINTER :: NCNEST_DATA(:)

◆ ncnest_fnames

character(len=80), dimension(:), allocatable mod_nesting::ncnest_fnames

Definition at line 112 of file mod_nesting.f90.

112  CHARACTER(LEN=80), ALLOCATABLE :: NCNEST_FNAMES(:)

◆ ncnest_grids

type(grid), dimension(:), pointer mod_nesting::ncnest_grids

Definition at line 113 of file mod_nesting.f90.

113  TYPE(GRID), POINTER :: NCNEST_GRIDS(:)

◆ ncnest_node_files

character(len=160) mod_nesting::ncnest_node_files

Definition at line 146 of file mod_nesting.f90.

146  CHARACTER(LEN=160) NCNEST_NODE_FILES

◆ ncnest_num

integer mod_nesting::ncnest_num

Definition at line 111 of file mod_nesting.f90.

111  INTEGER :: NCNEST_NUM

◆ ncnest_on

logical mod_nesting::ncnest_on

Definition at line 144 of file mod_nesting.f90.

144  LOGICAL NCNEST_ON

◆ ncnest_out_interval

character(len=80) mod_nesting::ncnest_out_interval

Definition at line 147 of file mod_nesting.f90.

147  CHARACTER(LEN=80) NCNEST_OUT_INTERVAL

◆ nesting_blocksize

integer mod_nesting::nesting_blocksize

Definition at line 133 of file mod_nesting.f90.

133  INTEGER :: NESTING_BLOCKSIZE !!SIZE OF DATA BLOCKS IN FILE

◆ nesting_data

type(nest_data), pointer mod_nesting::nesting_data

Definition at line 70 of file mod_nesting.f90.

70  TYPE(NEST_DATA), POINTER :: NESTING_DATA

◆ nesting_file

type(ncfile), pointer mod_nesting::nesting_file

Definition at line 71 of file mod_nesting.f90.

71  TYPE(NCFILE), POINTER :: NESTING_FILE

◆ nesting_file_name

character(len=80) mod_nesting::nesting_file_name

Definition at line 134 of file mod_nesting.f90.

134  CHARACTER(LEN=80) NESTING_FILE_NAME !!NAME OF RESTART FILE

◆ nesting_grid

type(grid), pointer mod_nesting::nesting_grid

Definition at line 69 of file mod_nesting.f90.

69  TYPE(GRID), POINTER :: NESTING_GRID

◆ nesting_on

logical mod_nesting::nesting_on

Definition at line 131 of file mod_nesting.f90.

131  LOGICAL NESTING_ON !!TRUE IF OUTPUT RESART FILES

◆ nesting_type

character(len=80) mod_nesting::nesting_type

Definition at line 132 of file mod_nesting.f90.

132  CHARACTER(LEN=80) NESTING_TYPE !!TYPE OF NESTING: 1, 2, 3

◆ s1_nest

real(sp), dimension(:,:), allocatable mod_nesting::s1_nest

Definition at line 81 of file mod_nesting.f90.

81  REAL(SP), ALLOCATABLE :: S1_NEST(:,:),T1_NEST(:,:)

◆ s1_nest_l

real(sp), dimension(:,:), allocatable mod_nesting::s1_nest_l

Definition at line 85 of file mod_nesting.f90.

85  REAL(SP), ALLOCATABLE :: S1_NEST_L(:,:),T1_NEST_L(:,:)

◆ t1_nest

real(sp), dimension(:,:), allocatable mod_nesting::t1_nest

Definition at line 81 of file mod_nesting.f90.

◆ t1_nest_l

real(sp), dimension(:,:), allocatable mod_nesting::t1_nest_l

Definition at line 85 of file mod_nesting.f90.

◆ time_interval

type(time) mod_nesting::time_interval

Definition at line 119 of file mod_nesting.f90.

◆ u_nest

real(sp), dimension(:,:), allocatable mod_nesting::u_nest

Definition at line 80 of file mod_nesting.f90.

80  REAL(SP), ALLOCATABLE :: U_NEST(:,:),V_NEST(:,:)

◆ u_nest_l

real(sp), dimension(:,:), allocatable mod_nesting::u_nest_l

Definition at line 84 of file mod_nesting.f90.

84  REAL(SP), ALLOCATABLE :: U_NEST_L(:,:),V_NEST_L(:,:)

◆ ua_nest

real(sp), dimension(:), allocatable mod_nesting::ua_nest

Definition at line 79 of file mod_nesting.f90.

79  REAL(SP), ALLOCATABLE :: UA_NEST(:),VA_NEST(:),EL_NEST(:)

◆ v_nest

real(sp), dimension(:,:), allocatable mod_nesting::v_nest

Definition at line 80 of file mod_nesting.f90.

◆ v_nest_l

real(sp), dimension(:,:), allocatable mod_nesting::v_nest_l

Definition at line 84 of file mod_nesting.f90.

◆ va_nest

real(sp), dimension(:), allocatable mod_nesting::va_nest

Definition at line 79 of file mod_nesting.f90.

◆ var_el

type(ncvar), pointer mod_nesting::var_el

Definition at line 95 of file mod_nesting.f90.

95  TYPE(NCVAR), POINTER :: VAR_EL

◆ var_hyw

type(ncvar), pointer mod_nesting::var_hyw

Definition at line 100 of file mod_nesting.f90.

100  TYPE(NCVAR), POINTER :: VAR_HYW

◆ var_s1

type(ncvar), pointer mod_nesting::var_s1

Definition at line 98 of file mod_nesting.f90.

98  TYPE(NCVAR), POINTER :: VAR_S1

◆ var_t1

type(ncvar), pointer mod_nesting::var_t1

Definition at line 99 of file mod_nesting.f90.

99  TYPE(NCVAR), POINTER :: VAR_T1

◆ var_time1

type(ncvar), pointer mod_nesting::var_time1

Definition at line 101 of file mod_nesting.f90.

101  TYPE(NCVAR), POINTER :: VAR_TIME1

◆ var_time2

type(ncvar), pointer mod_nesting::var_time2

Definition at line 102 of file mod_nesting.f90.

102  TYPE(NCVAR), POINTER :: VAR_TIME2

◆ var_u

type(ncvar), pointer mod_nesting::var_u

Definition at line 96 of file mod_nesting.f90.

96  TYPE(NCVAR), POINTER :: VAR_U

◆ var_ua

type(ncvar), pointer mod_nesting::var_ua

Definition at line 93 of file mod_nesting.f90.

93  TYPE(NCVAR), POINTER :: VAR_UA

◆ var_v

type(ncvar), pointer mod_nesting::var_v

Definition at line 97 of file mod_nesting.f90.

97  TYPE(NCVAR), POINTER :: VAR_V

◆ var_va

type(ncvar), pointer mod_nesting::var_va

Definition at line 94 of file mod_nesting.f90.

94  TYPE(NCVAR), POINTER :: VAR_VA

◆ var_wcell

type(ncvar), pointer mod_nesting::var_wcell

Definition at line 104 of file mod_nesting.f90.

104  TYPE(NCVAR), POINTER :: VAR_WCELL

◆ var_wnode

type(ncvar), pointer mod_nesting::var_wnode

Definition at line 105 of file mod_nesting.f90.

105  TYPE(NCVAR), POINTER :: VAR_WNODE

◆ wcell_nest

real(sp), dimension(:), allocatable mod_nesting::wcell_nest

Definition at line 90 of file mod_nesting.f90.

90  REAL(SP), ALLOCATABLE :: WCELL_NEST(:),WNODE_NEST(:)

◆ wnode_nest

real(sp), dimension(:), allocatable mod_nesting::wnode_nest

Definition at line 90 of file mod_nesting.f90.

◆ zz1_l

real(sp), dimension(:,:), allocatable, target mod_nesting::zz1_l

Definition at line 88 of file mod_nesting.f90.

◆ zz_l

real(sp), dimension(:,:), allocatable, target mod_nesting::zz_l

Definition at line 88 of file mod_nesting.f90.

88  REAL(SP), ALLOCATABLE, TARGET :: ZZ_L(:,:),ZZ1_L(:,:),H_L(:),H1_L(:)