SCALE-RM
Functions/Subroutines | Variables
scale_atmos_grid_cartesc_index Module Reference

module atmosphere / grid / cartesC index More...

Functions/Subroutines

subroutine, public atmos_grid_cartesc_index_setup (KMAX, IMAXG, JMAXG, IMAX, JMAX, KHALO, IHALO, JHALO, IBLOCK, JBLOCK)
 setup index More...
 
subroutine atmos_grid_cartesc_index_setup_main (KMAX_in, IMAXG_in, JMAXG_in, IMAX_in, JMAX_in, KHALO_in, IHALO_in, JHALO_in, IBLOCK_in, JBLOCK_in)
 

Variables

integer, parameter, public zdir = 1
 
integer, parameter, public xdir = 2
 
integer, parameter, public ydir = 3
 
integer, public kmax = -1
 
integer, public imax = -1
 
integer, public jmax = -1
 
integer, public iblock = -1
 block size for cache blocking: x More...
 
integer, public jblock = -1
 block size for cache blocking: y More...
 
integer, parameter, public khalo = 2
 
integer, public ihalo = 2
 
integer, public jhalo = 2
 
integer, public ka
 
integer, public ia
 
integer, public ja
 
integer, public ks
 start point of inner domain: z, local More...
 
integer, public ke
 end point of inner domain: z, local More...
 
integer, public is
 start point of inner domain: x, local More...
 
integer, public ie
 end point of inner domain: x, local More...
 
integer, public js
 start point of inner domain: y, local More...
 
integer, public je
 end point of inner domain: y, local More...
 
integer, public kijmax = -1
 
integer, public imaxb
 
integer, public jmaxb
 
integer, public isb
 
integer, public ieb
 
integer, public jsb
 
integer, public jeb
 
integer, public ieh
 end point of inner domain: x, local (half level) More...
 
integer, public jeh
 end point of inner domain: y, local (half level) More...
 
integer, public imaxg = -1
 
integer, public jmaxg = -1
 
integer, public iag
 
integer, public jag
 
integer, public iagb
 
integer, public jagb
 
integer, public is_ing
 start point of the inner domain: cx, global More...
 
integer, public ie_ing
 end point of the inner domain: cx, global More...
 
integer, public js_ing
 start point of the inner domain: cy, global More...
 
integer, public je_ing
 end point of the inner domain: cy, global More...
 
integer, public isga
 start point of the full domain: cx, global More...
 
integer, public iega
 end point of the full domain: cx, global More...
 
integer, public jsga
 start point of the full domain: cy, global More...
 
integer, public jega
 end point of the full domain: cy, global More...
 
integer, public isgb
 start point of the inner domain: x, global More...
 
integer, public iegb
 end point of the inner domain: x, global More...
 
integer, public jsgb
 start point of the inner domain: y, global More...
 
integer, public jegb
 end point of the inner domain: y, global More...
 
integer, public i_xyz = 1
 
integer, public i_xyw = 2
 
integer, public i_uyw = 3
 
integer, public i_xvw = 4
 
integer, public i_uyz = 5
 
integer, public i_xvz = 6
 
integer, public i_uvz = 7
 
integer, public i_xy = 1
 
integer, public i_uy = 2
 
integer, public i_xv = 3
 
integer, public i_uv = 4
 
integer, public i_fyz = 1
 
integer, public i_fxz = 2
 
integer, public i_fxy = 3
 

Detailed Description

module atmosphere / grid / cartesC index

Description
Atmospheric grid Index module for the CartesianC grid
Author
Team SCALE
NAMELIST
  • PARAM_ATMOS_GRID_CARTESC_INDEX
    nametypedefault valuecomment
    KMAX integer
    IMAXG integer
    JMAXG integer
    IMAX integer
    JMAX integer
    IHALO integer
    JHALO integer
    IBLOCK integer
    JBLOCK integer

History Output
No history output

Function/Subroutine Documentation

◆ atmos_grid_cartesc_index_setup()

subroutine, public scale_atmos_grid_cartesc_index::atmos_grid_cartesc_index_setup ( integer, intent(in), optional  KMAX,
integer, intent(in), optional  IMAXG,
integer, intent(in), optional  JMAXG,
integer, intent(in), optional  IMAX,
integer, intent(in), optional  JMAX,
integer, intent(in), optional  KHALO,
integer, intent(in), optional  IHALO,
integer, intent(in), optional  JHALO,
integer, intent(in), optional  IBLOCK,
integer, intent(in), optional  JBLOCK 
)

setup index

Definition at line 117 of file scale_atmos_grid_cartesC_index.F90.

117  use scale_prc_cartesc, only: &
118  prc_twod
119  implicit none
120  integer, intent(in), optional :: KMAX
121  integer, intent(in), optional :: IMAXG, JMAXG
122  integer, intent(in), optional :: IMAX, JMAX
123  integer, intent(in), optional :: KHALO, IHALO, JHALO
124  integer, intent(in), optional :: IBLOCK, JBLOCK
125 
127  kmax, &
128  imaxg, jmaxg, &
129  imax, jmax, &
130  khalo, ihalo, jhalo, &
131  iblock, jblock )
132 
133  if ( prc_twod ) then
134  i_xyz = 1
135  i_xyw = 2
136  i_xvw = 3
137  i_xvz = 4
138  i_uyw = i_xyw
139  i_uyz = i_xyz
140  i_uvz = i_xvz
141 
142  i_xy = 1
143  i_xv = 2
144  i_uy = i_xy
145  i_uv = i_xv
146  end if
147 
148  return

References atmos_grid_cartesc_index_setup_main(), i_uv, i_uvz, i_uy, i_uyw, i_uyz, i_xv, i_xvw, i_xvz, i_xy, i_xyw, i_xyz, iblock, ihalo, imax, imaxg, jblock, jhalo, jmax, jmaxg, khalo, kmax, and scale_prc_cartesc::prc_twod.

Referenced by mod_rm_driver::rm_driver(), and mod_rm_prep::rm_prep().

Here is the call graph for this function:
Here is the caller graph for this function:

◆ atmos_grid_cartesc_index_setup_main()

subroutine scale_atmos_grid_cartesc_index::atmos_grid_cartesc_index_setup_main ( integer, intent(in), optional  KMAX_in,
integer, intent(in), optional  IMAXG_in,
integer, intent(in), optional  JMAXG_in,
integer, intent(in), optional  IMAX_in,
integer, intent(in), optional  JMAX_in,
integer, intent(in), optional  KHALO_in,
integer, intent(in), optional  IHALO_in,
integer, intent(in), optional  JHALO_in,
integer, intent(in), optional  IBLOCK_in,
integer, intent(in), optional  JBLOCK_in 
)

Definition at line 157 of file scale_atmos_grid_cartesC_index.F90.

157  use scale_prc, only: &
158  prc_abort, &
159  prc_myrank
160  use scale_prc_cartesc, only: &
161  prc_periodic_x, &
162  prc_periodic_y, &
163  prc_twod, &
164  prc_2drank, &
165  prc_num_x, &
166  prc_num_y, &
167  prc_has_w, &
168  prc_has_e, &
169  prc_has_s, &
170  prc_has_n
171  implicit none
172  integer, intent(in), optional :: KMAX_in
173  integer, intent(in), optional :: IMAXG_in, JMAXG_in
174  integer, intent(in), optional :: IMAX_in, JMAX_in
175  integer, intent(in), optional :: KHALO_in, IHALO_in, JHALO_in
176  integer, intent(in), optional :: IBLOCK_in, JBLOCK_in
177 
178  namelist / param_atmos_grid_cartesc_index / &
179  kmax, &
180  imaxg, &
181  jmaxg, &
182  imax, &
183  jmax, &
184  ihalo, &
185  jhalo, &
186  iblock, &
187  jblock
188 
189  integer :: ierr
190  !---------------------------------------------------------------------------
191 
192  if ( present(kmax_in) ) kmax = kmax_in
193  if ( present(imaxg_in) ) imaxg = imaxg_in
194  if ( present(jmaxg_in) ) jmaxg = jmaxg_in
195  if ( present(imax_in) ) imax = imax_in
196  if ( present(jmax_in) ) jmax = jmax_in
197 ! if ( present(KHALO_in) ) KHALO = KHALO_in
198  if ( present(ihalo_in) ) ihalo = ihalo_in
199  if ( present(jhalo_in) ) jhalo = jhalo_in
200  if ( present(iblock_in) ) iblock = iblock_in
201  if ( present(jblock_in) ) jblock = jblock_in
202 
203  log_newline
204  log_info("ATMOS_GRID_CARTESC_index_setup_main",*) 'Setup'
205 
206  !--- read namelist
207  rewind(io_fid_conf)
208  read(io_fid_conf,nml=param_atmos_grid_cartesc_index,iostat=ierr)
209  if( ierr < 0 ) then !--- missing
210  log_info("ATMOS_GRID_CARTESC_index_setup_main",*) 'Not found namelist. Default used.'
211  elseif( ierr > 0 ) then !--- fatal error
212  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'Not appropriate names in namelist PARAM_ATMOS_GRID_CARTESC_INDEX. Check!'
213  call prc_abort
214  endif
215  log_nml(param_atmos_grid_cartesc_index)
216 
217  if ( kmax < 2 ) then
218  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'KMAX must be >= 2! ', kmax
219  call prc_abort
220  end if
221 
222 
223  if ( imaxg * jmaxg < 0 ) then
224  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'Both IMAXG and JMAXG must set! ', imaxg, jmaxg
225  call prc_abort
226  endif
227  if ( imax * jmax < 0 ) then
228  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'Both IMAX and JMAX must set! ', imax, jmax
229  call prc_abort
230  endif
231 
232  if ( imax > 0 .AND. jmax > 0 ) then
233  imaxg = imax * prc_num_x
234  jmaxg = jmax * prc_num_y
235  elseif( imaxg > 0 .AND. jmaxg > 0 ) then
236  imax = (imaxg-1) / prc_num_x + 1
237  jmax = (jmaxg-1) / prc_num_y + 1
238 
239  if ( mod(imaxg,prc_num_x) > 0 ) then
240  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'number of IMAXG should be divisible by PRC_NUM_X'
241  call prc_abort
242 ! LOG_INFO("ATMOS_GRID_CARTESC_index_setup_main",*) 'number of IMAXG should be divisible by PRC_NUM_X'
243 ! LOG_INFO("ATMOS_GRID_CARTESC_index_setup_main",*) 'Small IMAX is used in ranks(X,*)=', PRC_NUM_X-1
244 ! if ( PRC_2Drank(PRC_myrank,1) == PRC_NUM_X-1 ) then
245 ! IMAX = IMAXG - IMAX * (PRC_NUM_X-1)
246 ! LOG_INFO("ATMOS_GRID_CARTESC_index_setup_main",*) 'Small IMAX is used in this rank. IMAX=', IMAX
247 ! endif
248  endif
249 
250  if ( mod(jmaxg,prc_num_y) > 0 ) then
251  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'number of JMAXG should be divisible by PRC_NUM_Y'
252  call prc_abort
253 ! LOG_INFO("ATMOS_GRID_CARTESC_index_setup_main",*) 'number of JMAXG should be divisible by PRC_NUM_Y'
254 ! LOG_INFO("ATMOS_GRID_CARTESC_index_setup_main",*) 'Small JMAX is used in ranks(*,Y)=', PRC_NUM_Y-1
255 ! if ( PRC_2Drank(PRC_myrank,2) == PRC_NUM_Y-1 ) then
256 ! JMAX = JMAXG - JMAX * (PRC_NUM_Y-1)
257 ! LOG_INFO("ATMOS_GRID_CARTESC_index_setup_main",*) 'Small JMAX is used in this rank. JMAX=', JMAX
258 ! endif
259  endif
260  else
261  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'IMAXG&JMAXG or IMAX&JMAX must set!'
262  call prc_abort
263  endif
264 
265 
266  ! check if this is 2D experiment
267  if ( imaxg == 1 ) then
268  prc_twod = .true.
269  ihalo = 0
270  else
271  prc_twod = .false.
272  end if
273 
274 
275  if ( imax < ihalo ) then
276  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'number of grid size IMAX must >= IHALO! ', imax, ihalo
277  call prc_abort
278  endif
279  if ( jmax < jhalo ) then
280  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'number of grid size JMAX must >= JHALO! ', jmax, jhalo
281  call prc_abort
282  endif
283 
284  ka = kmax + khalo * 2
285  ia = imax + ihalo * 2
286  ja = jmax + jhalo * 2
287 
288  ks = 1 + khalo
289  ke = kmax + khalo
290  is = 1 + ihalo
291  ie = imax + ihalo
292  js = 1 + jhalo
293  je = jmax + jhalo
294 
295  if( iblock == -1 ) iblock = imax
296  if( jblock == -1 ) jblock = jmax
297 
298  kijmax = kmax * imax * jmax
299 
300 
301  !-- Block size must be divisible
302  if ( mod(imax,iblock) > 0 ) then
303  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'number of grid size IMAX must be divisible by IBLOCK! ', imax, iblock
304  call prc_abort
305  elseif( mod(jmax,jblock) > 0 ) then
306  log_error("ATMOS_GRID_CARTESC_index_setup_main",*) 'number of grid size JMAX must be divisible by JBLOCK! ', jmax, jblock
307  call prc_abort
308  endif
309 
310  ! array size (global domain)
311  iag = imaxg + ihalo * 2
312  jag = jmaxg + jhalo * 2
313 
314  ! horizontal index (global domain)
315  is_ing = ihalo + 1 + prc_2drank(prc_myrank,1) * imax
316  ie_ing = ihalo + imax + prc_2drank(prc_myrank,1) * imax
317  js_ing = jhalo + 1 + prc_2drank(prc_myrank,2) * jmax
318  je_ing = jhalo + jmax + prc_2drank(prc_myrank,2) * jmax
319 
320  if ( prc_2drank(prc_myrank,1) == 0 ) then
321  isga = 1
322  else
323  isga = is_ing
324  end if
325  if ( prc_2drank(prc_myrank,1) == prc_num_x - 1 ) then
326  iega = iag
327  else
328  iega = ie_ing
329  end if
330  if ( prc_2drank(prc_myrank,2) == 0 ) then
331  jsga = 1
332  else
333  jsga = js_ing
334  end if
335  if ( prc_2drank(prc_myrank,2) == prc_num_y - 1 ) then
336  jega = jag
337  else
338  jega = je_ing
339  end if
340 
341  if ( prc_periodic_x .or. prc_twod ) then
342  iagb = imaxg
343  isgb = is_ing - ihalo
344  iegb = ie_ing - ihalo
345  else
346  iagb = iag
347  if ( prc_has_w ) then
348  isgb = is_ing
349  else ! western boundary
350  isgb = is_ing - ihalo ! ISGB = 1
351  end if
352  if ( prc_has_e ) then
353  iegb = ie_ing
354  else ! eastern boundary
355  iegb = ie_ing + ihalo
356  end if
357  end if
358  if ( prc_periodic_y ) then
359  jagb = jmaxg
360  jsgb = js_ing - jhalo
361  jegb = je_ing - jhalo
362  else
363  jagb = jag
364  if ( prc_has_s ) then
365  jsgb = js_ing
366  else ! southern boundary
367  jsgb = js_ing - jhalo ! JSGY = 1
368  end if
369  if ( prc_has_n ) then
370  jegb = je_ing
371  else ! northern boundary
372  jegb = je_ing + jhalo
373  end if
374  end if
375 
376  ! index considering boundary region
377  imaxb = imax
378  jmaxb = jmax
379  isb = is
380  ieb = ie
381  jsb = js
382  jeb = je
383  ieh = ie
384  jeh = je
385 
386  if ( .NOT. prc_has_w ) then
387  imaxb = imaxb + ihalo
388  isb = 1
389  endif
390  if ( .NOT. prc_has_e ) then
391  imaxb = imaxb + ihalo
392  ieb = ia
393  ieh = ie - 1
394  endif
395  if ( .NOT. prc_has_s ) then
396  jmaxb = jmaxb + jhalo
397  jsb = 1
398  endif
399  if ( .NOT. prc_has_n ) then
400  jmaxb = jmaxb + jhalo
401  jeb = ja
402  jeh = je - 1
403  endif
404 
405  log_newline
406  log_info("ATMOS_GRID_CARTESC_index_setup_main",*) 'Atmosphere grid index information '
407 
408  ! global
409  log_info_cont('(1x,3(A,I6))') 'No. of Computational Grid (global) :', &
410  kmax,' x ',imaxg,' x ',jmaxg
411  log_info_cont('(1x,2(A,I6))') 'Global index of local grid (X) :', &
412  is_ing," - ",ie_ing
413  log_info_cont('(1x,2(A,I6))') 'Global index of local grid (Y) :', &
414  js_ing," - ",je_ing
415 
416  ! local
417  log_newline
418  log_info_cont('(1x,3(A,I6))') 'No. of Computational Grid (local) :', &
419  kmax,' x ',imax,' x ',jmax
420  log_info_cont('(1x,3(A,I6))') 'No. of Grid (including HALO, local) :', &
421  ka," x ",ia," x ",ja
422  log_info_cont('(1x,2(A,I6))') 'Local index of inner grid (X) :', &
423  isb," - ",ieb
424  log_info_cont('(1x,2(A,I6))') 'Local index of inner grid (Y) :', &
425  jsb," - ",jeb
426 
427  return

References ia, iag, iagb, iblock, ie, ie_ing, ieb, iega, iegb, ieh, ihalo, imax, imaxb, imaxg, scale_io::io_fid_conf, is, is_ing, isb, isga, isgb, ja, jag, jagb, jblock, je, je_ing, jeb, jega, jegb, jeh, jhalo, jmax, jmaxb, jmaxg, js, js_ing, jsb, jsga, jsgb, ka, ke, khalo, kijmax, kmax, ks, scale_prc_cartesc::prc_2drank, scale_prc::prc_abort(), scale_prc_cartesc::prc_has_e, scale_prc_cartesc::prc_has_n, scale_prc_cartesc::prc_has_s, scale_prc_cartesc::prc_has_w, scale_prc::prc_myrank, scale_prc_cartesc::prc_num_x, scale_prc_cartesc::prc_num_y, scale_prc_cartesc::prc_periodic_x, scale_prc_cartesc::prc_periodic_y, and scale_prc_cartesc::prc_twod.

Referenced by atmos_grid_cartesc_index_setup().

Here is the call graph for this function:
Here is the caller graph for this function:

Variable Documentation

◆ zdir

integer, parameter, public scale_atmos_grid_cartesc_index::zdir = 1

◆ xdir

integer, parameter, public scale_atmos_grid_cartesc_index::xdir = 2

◆ ydir

integer, parameter, public scale_atmos_grid_cartesc_index::ydir = 3

◆ kmax

integer, public scale_atmos_grid_cartesc_index::kmax = -1

◆ imax

integer, public scale_atmos_grid_cartesc_index::imax = -1

◆ jmax

integer, public scale_atmos_grid_cartesc_index::jmax = -1

◆ iblock

integer, public scale_atmos_grid_cartesc_index::iblock = -1

◆ jblock

integer, public scale_atmos_grid_cartesc_index::jblock = -1

◆ khalo

integer, parameter, public scale_atmos_grid_cartesc_index::khalo = 2

◆ ihalo

integer, public scale_atmos_grid_cartesc_index::ihalo = 2

◆ jhalo

integer, public scale_atmos_grid_cartesc_index::jhalo = 2

◆ ka

integer, public scale_atmos_grid_cartesc_index::ka

of whole cells: z, local, with HALO

Definition at line 47 of file scale_atmos_grid_cartesC_index.F90.

47  integer, public :: KA

Referenced by mod_atmos_vars::allocate_1d(), mod_atmos_vars::allocate_3d(), mod_atmos_bnd_driver::atmos_boundary_driver_send(), mod_atmos_bnd_driver::atmos_boundary_driver_set(), mod_atmos_bnd_driver::atmos_boundary_driver_setup(), mod_atmos_driver::atmos_driver_setup(), mod_atmos_driver::atmos_driver_update(), mod_atmos_dyn_driver::atmos_dyn_driver(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_apply_numfilter(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux_q(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_setup(), scale_atmos_dyn::atmos_dyn_setup(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_rkwork_alloc(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_setup(), scale_atmos_dyn_tinteg_short_rk11s8o::atmos_dyn_tinteg_short_rk11s8o(), scale_atmos_dyn_tinteg_short_rk3::atmos_dyn_tinteg_short_rk3(), scale_atmos_dyn_tinteg_short_rk3::atmos_dyn_tinteg_short_rk3_setup(), scale_atmos_dyn_tinteg_short_rk4::atmos_dyn_tinteg_short_rk4(), scale_atmos_dyn_tinteg_short_rk4::atmos_dyn_tinteg_short_rk4_setup(), scale_atmos_dyn_tinteg_short_rk7s6o::atmos_dyn_tinteg_short_rk7s6o(), scale_atmos_dyn_tinteg_tracer_linrk::atmos_dyn_tinteg_tracer_linrk_setup(), scale_atmos_dyn_tinteg_tracer_rk3::atmos_dyn_tinteg_tracer_rk3_setup(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve_setup(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), mod_atmos_dyn_vars::atmos_dyn_vars_check(), mod_atmos_dyn_vars::atmos_dyn_vars_fillhalo(), mod_atmos_dyn_vars::atmos_dyn_vars_restart_read(), mod_atmos_dyn_vars::atmos_dyn_vars_setup(), scale_atmos_dyn_common::atmos_dyn_wdamp_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_allocate(), scale_atmos_grid_cartesc::atmos_grid_cartesc_generate(), atmos_grid_cartesc_index_setup_main(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_output_info(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_z(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_setup(), scale_atmos_grid_icoa_index::atmos_grid_icoa_index_setup(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_adjustment(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_calc_tendency(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_mkinit(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_fillhalo(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_get_diagnostic(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_reset_diagnostics(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_restart_read(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_setup(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_setup(), scale_atmos_phy_bl_mynn::atmos_phy_bl_mynn_tendency(), mod_atmos_phy_bl_vars::atmos_phy_bl_vars_setup(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_calc_tendency(), mod_atmos_phy_ch_vars::atmos_phy_ch_vars_setup(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_tendency(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_check(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_fillhalo(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_restart_read(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_setup(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_adjustment(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_setup(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_fillhalo(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_read(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_write(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_setup(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_adjustment(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_calc_tendency(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_setup(), scale_atmos_phy_mp_common::atmos_phy_mp_negative_fixer(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_setup(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_calc_tendency(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_setup(), mod_atmos_phy_rd_vars::atmos_phy_rd_vars_setup(), mod_atmos_phy_sf_driver::atmos_phy_sf_driver_calc_tendency(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980_setup(), scale_atmos_phy_tb_common::atmos_phy_tb_diffusion_solver(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_calc_tendency(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg_setup(), mod_atmos_phy_tb_vars::atmos_phy_tb_vars_setup(), mod_atmos_driver::atmos_surface_set(), mod_atmos_vars::atmos_vars_calc_diagnostics(), mod_atmos_vars::atmos_vars_check(), mod_atmos_vars::atmos_vars_fillhalo(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_get_diagnostic_2d(), mod_atmos_vars::atmos_vars_get_diagnostic_3d(), mod_atmos_vars::atmos_vars_history_setpres(), mod_atmos_vars::atmos_vars_restart_read(), mod_atmos_vars::atmos_vars_setup(), mod_cnvuser::cnvuser(), mod_cnvuser::cnvuser_setup(), scale_comm_cartesc_nest::comm_cartesc_nest_setup(), scale_comm_cartesc::comm_setup(), scale_file_cartesc::construct_derived_datatype(), scale_file_cartesc::file_cartesc_def_axes(), scale_file_cartesc::file_cartesc_read_1d(), scale_file_cartesc::file_cartesc_read_var_2d(), scale_file_cartesc::file_cartesc_read_var_3d(), scale_file_cartesc::file_cartesc_read_var_4d(), scale_file_external_input_cartesc::file_external_input_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_set_pres(), scale_file_history_cartesc::file_history_cartesc_setup(), mod_atmos_phy_sf_driver::history_output(), mod_mkinit::mkinit(), mod_mkinit::mkinit_setup(), scale_monitor_cartesc::monitor_cartesc_setup(), mod_mkinit::read_sounding(), mod_realinput::realinput_atmos(), mod_realinput::realinput_surface(), mod_mkinit::rect_setup(), mod_rm_driver::restart_read(), scale_file_cartesc::set_dimension_informations(), and mod_mkinit::tke_setup().

◆ ia

integer, public scale_atmos_grid_cartesc_index::ia

of whole cells: x, local, with HALO

Definition at line 48 of file scale_atmos_grid_cartesC_index.F90.

48  integer, public :: IA

Referenced by mod_atmos_vars::allocate_2d(), mod_atmos_vars::allocate_3d(), mod_atmos_bnd_driver::atmos_boundary_driver_send(), mod_atmos_bnd_driver::atmos_boundary_driver_set(), mod_atmos_bnd_driver::atmos_boundary_driver_setup(), mod_atmos_bnd_driver::atmos_boundary_set_online(), mod_atmos_driver::atmos_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn_common::atmos_dyn_copy_boundary(), scale_atmos_dyn_common::atmos_dyn_copy_boundary_tracer(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux_q(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_setup(), scale_atmos_dyn_common::atmos_dyn_prep_pres_linearization(), scale_atmos_dyn::atmos_dyn_setup(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_rkwork_alloc(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_setup(), scale_atmos_dyn_tinteg_short_rk3::atmos_dyn_tinteg_short_rk3_setup(), scale_atmos_dyn_tinteg_short_rk4::atmos_dyn_tinteg_short_rk4_setup(), scale_atmos_dyn_tinteg_tracer_linrk::atmos_dyn_tinteg_tracer_linrk(), scale_atmos_dyn_tinteg_tracer_linrk::atmos_dyn_tinteg_tracer_linrk_setup(), scale_atmos_dyn_tinteg_tracer_rk3::atmos_dyn_tinteg_tracer_rk3(), scale_atmos_dyn_tinteg_tracer_rk3::atmos_dyn_tinteg_tracer_rk3_setup(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve_setup(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), mod_atmos_dyn_vars::atmos_dyn_vars_check(), mod_atmos_dyn_vars::atmos_dyn_vars_restart_read(), mod_atmos_dyn_vars::atmos_dyn_vars_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_allocate(), scale_atmos_grid_cartesc::atmos_grid_cartesc_generate(), atmos_grid_cartesc_index_setup_main(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_output_info(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_areavol(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_z(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_setup(), scale_atmos_grid_icoa_index::atmos_grid_icoa_index_setup(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_adjustment(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_calc_tendency(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_mkinit(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_get_diagnostic(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_reset_diagnostics(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_restart_read(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_setup(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_setup(), mod_atmos_phy_bl_vars::atmos_phy_bl_vars_check(), mod_atmos_phy_bl_vars::atmos_phy_bl_vars_setup(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_calc_tendency(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_setup(), mod_atmos_phy_ch_vars::atmos_phy_ch_vars_setup(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_setup(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_check(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_restart_read(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_setup(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_adjustment(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_setup(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_read(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_write(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_setup(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_adjustment(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_calc_tendency(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_setup(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_setup(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_calc_tendency(), mod_atmos_phy_rd_vars::atmos_phy_rd_vars_check(), mod_atmos_phy_rd_vars::atmos_phy_rd_vars_setup(), mod_atmos_phy_sf_driver::atmos_phy_sf_driver_calc_tendency(), mod_atmos_phy_sf_vars::atmos_phy_sf_vars_check(), mod_atmos_phy_sf_vars::atmos_phy_sf_vars_setup(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980_setup(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_calc_tendency(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg_setup(), mod_atmos_phy_tb_vars::atmos_phy_tb_vars_setup(), mod_atmos_driver::atmos_surface_set(), mod_atmos_vars::atmos_vars_calc_diagnostics(), mod_atmos_vars::atmos_vars_check(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_get_diagnostic_2d(), mod_atmos_vars::atmos_vars_get_diagnostic_3d(), mod_atmos_vars::atmos_vars_history_setpres(), mod_atmos_vars::atmos_vars_restart_read(), mod_atmos_vars::atmos_vars_setup(), mod_cnv2d::cnv2d_exec(), mod_cnvlanduse::cnvlanduse(), mod_cnvtopo::cnvtopo(), mod_cnvtopo::cnvtopo_setup(), mod_cnvuser::cnvuser(), mod_cnvuser::cnvuser_setup(), scale_comm_cartesc_nest::comm_cartesc_nest_domain_shape(), scale_comm_cartesc_nest::comm_cartesc_nest_setup(), scale_comm_cartesc::comm_setup(), scale_file_cartesc::construct_derived_datatype(), mod_copytopo::copytopo(), mod_cpl_vars::cpl_vars_setup(), scale_file_cartesc::file_cartesc_def_axes(), scale_file_cartesc::file_cartesc_read_1d(), scale_file_cartesc::file_cartesc_read_var_2d(), scale_file_cartesc::file_cartesc_read_var_3d(), scale_file_cartesc::file_cartesc_read_var_4d(), scale_file_cartesc::file_cartesc_setup(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_3d_t(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_external_input_cartesc::file_external_input_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_set_pres(), scale_file_history_cartesc::file_history_cartesc_setup(), scale_land_grid_cartesc_index::land_grid_cartesc_index_setup(), scale_landuse::landuse_calc_fact(), scale_landuse::landuse_fillhalo(), scale_landuse::landuse_setup(), mod_mkinit::mkinit(), mod_mkinit::mkinit_setup(), mod_mktopo::mktopo(), scale_monitor_cartesc::monitor_cartesc_setup(), scale_ocean_grid_cartesc_index::ocean_grid_cartesc_index_setup(), mod_mkinit::read_sounding(), mod_realinput::realinput_atmos(), mod_realinput::realinput_surface(), mod_mkinit::rect_setup(), mod_realinput::replace_misval_const(), mod_rm_driver::restart_read(), mod_rm_driver::rm_driver(), mod_rm_prep::rm_prep(), mod_atmos_bnd_driver::set_boundary(), scale_file_cartesc::set_dimension_informations(), mod_mkinit::tke_setup(), scale_topography::topography_setup(), and scale_urban_grid_cartesc_index::urban_grid_cartesc_index_setup().

◆ ja

integer, public scale_atmos_grid_cartesc_index::ja

of whole cells: y, local, with HALO

Definition at line 49 of file scale_atmos_grid_cartesC_index.F90.

49  integer, public :: JA

Referenced by mod_atmos_vars::allocate_2d(), mod_atmos_vars::allocate_3d(), mod_atmos_bnd_driver::atmos_boundary_driver_send(), mod_atmos_bnd_driver::atmos_boundary_driver_set(), mod_atmos_bnd_driver::atmos_boundary_driver_setup(), mod_atmos_bnd_driver::atmos_boundary_set_online(), mod_atmos_driver::atmos_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn_common::atmos_dyn_copy_boundary(), scale_atmos_dyn_common::atmos_dyn_copy_boundary_tracer(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_setup(), scale_atmos_dyn_common::atmos_dyn_prep_pres_linearization(), scale_atmos_dyn::atmos_dyn_setup(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_rkwork_alloc(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_setup(), scale_atmos_dyn_tinteg_short_rk3::atmos_dyn_tinteg_short_rk3_setup(), scale_atmos_dyn_tinteg_short_rk4::atmos_dyn_tinteg_short_rk4_setup(), scale_atmos_dyn_tinteg_tracer_linrk::atmos_dyn_tinteg_tracer_linrk_setup(), scale_atmos_dyn_tinteg_tracer_rk3::atmos_dyn_tinteg_tracer_rk3_setup(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve_setup(), mod_atmos_dyn_vars::atmos_dyn_vars_check(), mod_atmos_dyn_vars::atmos_dyn_vars_restart_read(), mod_atmos_dyn_vars::atmos_dyn_vars_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_allocate(), scale_atmos_grid_cartesc::atmos_grid_cartesc_generate(), atmos_grid_cartesc_index_setup_main(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_output_info(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_areavol(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_z(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_setup(), scale_atmos_grid_icoa_index::atmos_grid_icoa_index_setup(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_adjustment(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_calc_tendency(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_mkinit(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_get_diagnostic(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_reset_diagnostics(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_restart_read(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_setup(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_setup(), mod_atmos_phy_bl_vars::atmos_phy_bl_vars_check(), mod_atmos_phy_bl_vars::atmos_phy_bl_vars_setup(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_calc_tendency(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_setup(), mod_atmos_phy_ch_vars::atmos_phy_ch_vars_setup(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_setup(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_check(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_restart_read(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_setup(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_adjustment(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_setup(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_read(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_write(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_setup(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_adjustment(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_calc_tendency(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_setup(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_setup(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_calc_tendency(), mod_atmos_phy_rd_vars::atmos_phy_rd_vars_check(), mod_atmos_phy_rd_vars::atmos_phy_rd_vars_setup(), mod_atmos_phy_sf_driver::atmos_phy_sf_driver_calc_tendency(), mod_atmos_phy_sf_vars::atmos_phy_sf_vars_check(), mod_atmos_phy_sf_vars::atmos_phy_sf_vars_setup(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980_setup(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_calc_tendency(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg_setup(), mod_atmos_phy_tb_vars::atmos_phy_tb_vars_setup(), mod_atmos_driver::atmos_surface_set(), mod_atmos_vars::atmos_vars_calc_diagnostics(), mod_atmos_vars::atmos_vars_check(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_get_diagnostic_2d(), mod_atmos_vars::atmos_vars_get_diagnostic_3d(), mod_atmos_vars::atmos_vars_history_setpres(), mod_atmos_vars::atmos_vars_restart_read(), mod_atmos_vars::atmos_vars_setup(), mod_cnv2d::cnv2d_exec(), mod_cnvlanduse::cnvlanduse(), mod_cnvtopo::cnvtopo(), mod_cnvtopo::cnvtopo_setup(), mod_cnvuser::cnvuser(), mod_cnvuser::cnvuser_setup(), scale_comm_cartesc_nest::comm_cartesc_nest_domain_shape(), scale_comm_cartesc_nest::comm_cartesc_nest_setup(), scale_comm_cartesc::comm_setup(), scale_file_cartesc::construct_derived_datatype(), mod_copytopo::copytopo(), mod_cpl_vars::cpl_vars_setup(), scale_file_cartesc::file_cartesc_def_axes(), scale_file_cartesc::file_cartesc_read_1d(), scale_file_cartesc::file_cartesc_read_var_2d(), scale_file_cartesc::file_cartesc_read_var_3d(), scale_file_cartesc::file_cartesc_read_var_4d(), scale_file_cartesc::file_cartesc_setup(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_3d_t(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_external_input_cartesc::file_external_input_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_set_pres(), scale_file_history_cartesc::file_history_cartesc_setup(), scale_land_grid_cartesc_index::land_grid_cartesc_index_setup(), scale_landuse::landuse_calc_fact(), scale_landuse::landuse_fillhalo(), scale_landuse::landuse_setup(), mod_mkinit::mkinit(), mod_mkinit::mkinit_setup(), mod_mktopo::mktopo(), scale_monitor_cartesc::monitor_cartesc_setup(), scale_ocean_grid_cartesc_index::ocean_grid_cartesc_index_setup(), mod_mkinit::read_sounding(), mod_realinput::realinput_atmos(), mod_realinput::realinput_surface(), mod_mkinit::rect_setup(), mod_realinput::replace_misval_const(), mod_rm_driver::restart_read(), mod_rm_driver::rm_driver(), mod_rm_prep::rm_prep(), mod_atmos_bnd_driver::set_boundary(), scale_file_cartesc::set_dimension_informations(), mod_mkinit::tke_setup(), scale_topography::topography_setup(), and scale_urban_grid_cartesc_index::urban_grid_cartesc_index_setup().

◆ ks

integer, public scale_atmos_grid_cartesc_index::ks

start point of inner domain: z, local

Definition at line 51 of file scale_atmos_grid_cartesC_index.F90.

51  integer, public :: KS

Referenced by mod_atmos_bnd_driver::atmos_boundary_driver_send(), mod_atmos_bnd_driver::atmos_boundary_driver_set(), mod_atmos_bnd_driver::atmos_boundary_driver_setup(), mod_atmos_bnd_driver::atmos_boundary_set_file(), mod_atmos_bnd_driver::atmos_boundary_set_online(), mod_atmos_driver::atmos_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn::atmos_dyn(), scale_atmos_dyn_common::atmos_dyn_copy_boundary(), scale_atmos_dyn_common::atmos_dyn_copy_boundary_tracer(), scale_atmos_dyn_common::atmos_dyn_divergence(), mod_atmos_dyn_driver::atmos_dyn_driver(), mod_atmos_dyn_driver::atmos_dyn_driver_setup(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_apply_numfilter(), scale_atmos_dyn_fvm_fct::atmos_dyn_fvm_fct(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_flux_valuew_z_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_flux_valuew_z_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_flux_valuew_z_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_flux_valuew_z_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_flux_valuew_z_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_flux_valuew_z_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_flux_valuew_z_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_flux_valuew_z_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_flux_valuew_z_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj13_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj13_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj13_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj13_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj13_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj13_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj13_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj13_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj13_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj13_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj13_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj13_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj13_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj13_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj13_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj13_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj13_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj13_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj13_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj13_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj13_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj13_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj13_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj13_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj13_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj13_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj13_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj23_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj23_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj23_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj23_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj23_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj23_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj23_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj23_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj23_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj23_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj23_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj23_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj23_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj23_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj23_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj23_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj23_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj23_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj23_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj23_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj23_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj23_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj23_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj23_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj23_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj23_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj23_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxx_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxx_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxx_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxx_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxx_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxx_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxx_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxx_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxx_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxx_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxx_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxx_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxx_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxx_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxx_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxx_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxx_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxx_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxx_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxx_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxx_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxx_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxx_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxx_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxx_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxx_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxx_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxx_xyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxx_xyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxx_xyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxx_xyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxx_xyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxx_xyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxx_xyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxx_xyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxx_xyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxy_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxy_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxy_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxy_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxy_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxy_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxy_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxy_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxy_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxy_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxy_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxy_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxy_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxy_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxy_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxy_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxy_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxy_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxy_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxy_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxy_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxy_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxy_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxy_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxy_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxy_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxy_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxy_xyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxy_xyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxy_xyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxy_xyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxy_xyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxy_xyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxy_xyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxy_xyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxy_xyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_xyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_xyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_xyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_xyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_xyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_xyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_xyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_xyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_xyz_ud7(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux_q(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_setup(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_tend(), scale_atmos_dyn_common::atmos_dyn_prep_pres_linearization(), scale_atmos_dyn::atmos_dyn_setup(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_nextstage(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updateflux(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updatevar(), scale_atmos_dyn_tinteg_short_rk11s8o::atmos_dyn_tinteg_short_rk11s8o(), scale_atmos_dyn_tinteg_short_rk3::atmos_dyn_tinteg_short_rk3(), scale_atmos_dyn_tinteg_short_rk4::atmos_dyn_tinteg_short_rk4(), scale_atmos_dyn_tinteg_short_rk7s6o::atmos_dyn_tinteg_short_rk7s6o(), scale_atmos_dyn_tinteg_tracer_linrk::atmos_dyn_tinteg_tracer_linrk(), scale_atmos_dyn_tinteg_tracer_rk3::atmos_dyn_tinteg_tracer_rk3(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), scale_atmos_dyn_tstep_tracer_fvm_heve::atmos_dyn_tstep_tracer_fvm_heve(), mod_atmos_dyn_vars::atmos_dyn_vars_check(), mod_atmos_dyn_vars::atmos_dyn_vars_fillhalo(), mod_atmos_dyn_vars::atmos_dyn_vars_restart_read(), scale_atmos_dyn_common::atmos_dyn_wdamp_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_generate(), atmos_grid_cartesc_index_setup_main(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_grid_cartesc::atmos_grid_cartesc_output_info(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_areavol(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_z(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_setup(), scale_atmos_grid_icoa_index::atmos_grid_icoa_index_setup(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_adjustment(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_calc_tendency(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_mkinit(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_negative_fixer(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_tendency(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_fillhalo(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_reset_diagnostics(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_restart_read(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_setup(), scale_atmos_phy_bl_mynn::atmos_phy_bl_mynn_tendency(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_calc_tendency(), scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_tendency(), scale_atmos_phy_cp_common::atmos_phy_cp_common_wmean(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_tendency(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_check(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_fillhalo(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_restart_read(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_adjustment(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_setup(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_fillhalo(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_read(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_write(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_adjustment(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_calc_tendency(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc_onlyqv(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_setup(), scale_atmos_phy_mp_common::atmos_phy_mp_negative_fixer(), scale_atmos_phy_mp_common::atmos_phy_mp_precipitation_momentum(), scale_atmos_phy_mp_common::atmos_phy_mp_precipitation_semilag(), scale_atmos_phy_mp_common::atmos_phy_mp_precipitation_upwind(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_calc_tendency(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_setup(), mod_atmos_phy_sf_driver::atmos_phy_sf_driver_calc_tendency(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_flux_phi(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_strain_tensor(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momx(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momy(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momz(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_phi(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980_setup(), scale_atmos_phy_tb_common::atmos_phy_tb_diffusion_solver(), scale_atmos_phy_tb_dns::atmos_phy_tb_dns(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_calc_tendency(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_setup(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg_setup(), mod_atmos_driver::atmos_surface_set(), mod_atmos_vars::atmos_vars_calc_diagnostics(), mod_atmos_vars::atmos_vars_check(), mod_atmos_vars::atmos_vars_fillhalo(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_get_diagnostic_2d(), mod_atmos_vars::atmos_vars_get_diagnostic_3d(), mod_atmos_vars::atmos_vars_history_setpres(), mod_atmos_vars::atmos_vars_monitor(), mod_atmos_vars::atmos_vars_restart_check(), mod_atmos_vars::atmos_vars_restart_read(), mod_atmos_vars::atmos_vars_setup(), mod_atmos_bnd_driver::calc_mass(), mod_cnvtopo::cnvtopo_setup(), scale_comm_cartesc_nest::comm_cartesc_nest_domain_shape(), scale_file_cartesc::construct_derived_datatype(), scale_file_cartesc::file_cartesc_read_1d(), scale_file_cartesc::file_cartesc_read_var_2d(), scale_file_cartesc::file_cartesc_read_var_3d(), scale_file_cartesc::file_cartesc_read_var_4d(), scale_file_cartesc::file_cartesc_set_areavol_atmos(), scale_file_cartesc::file_cartesc_set_coordinates_atmos(), scale_file_cartesc::file_cartesc_set_coordinates_urban(), scale_file_cartesc::file_cartesc_write_axes(), scale_file_cartesc::file_cartesc_write_var_1d(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_external_input_cartesc::file_external_input_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_set_pres(), scale_file_history_cartesc::file_history_cartesc_truncate_1d(), scale_file_history_cartesc::file_history_cartesc_truncate_3d(), mod_atmos_phy_lt_driver::history(), mod_atmos_phy_sf_driver::history_output(), scale_atmos_dyn_tstep_short_fvm_hivi::make_matrix(), mod_mkinit::mkinit(), scale_monitor_cartesc::monitor_cartesc_setup(), scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz(), mod_mkinit::read_sounding(), mod_realinput::realinput_atmos(), mod_realinput::realinput_surface(), mod_mkinit::rect_setup(), mod_rm_driver::restart_read(), mod_atmos_bnd_driver::set_boundary(), mod_atmos_bnd_driver::set_offset(), scale_atmos_dyn_tstep_short_fvm_hivi::solve_bicgstab(), scale_atmos_dyn_tstep_short_fvm_hevi::solve_direct(), scale_atmos_phy_rd_mm5sw::swrad(), and mod_realinput::urban_input().

◆ ke

integer, public scale_atmos_grid_cartesc_index::ke

end point of inner domain: z, local

Definition at line 52 of file scale_atmos_grid_cartesC_index.F90.

52  integer, public :: KE

Referenced by mod_atmos_bnd_driver::atmos_boundary_driver_send(), mod_atmos_bnd_driver::atmos_boundary_driver_set(), mod_atmos_bnd_driver::atmos_boundary_driver_setup(), mod_atmos_bnd_driver::atmos_boundary_set_file(), mod_atmos_bnd_driver::atmos_boundary_set_online(), mod_atmos_driver::atmos_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn::atmos_dyn(), scale_atmos_dyn_common::atmos_dyn_copy_boundary(), scale_atmos_dyn_common::atmos_dyn_copy_boundary_tracer(), scale_atmos_dyn_common::atmos_dyn_divergence(), mod_atmos_dyn_driver::atmos_dyn_driver(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_apply_numfilter(), scale_atmos_dyn_fvm_fct::atmos_dyn_fvm_fct(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_flux_valuew_z_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_flux_valuew_z_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_flux_valuew_z_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_flux_valuew_z_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_flux_valuew_z_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_flux_valuew_z_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_flux_valuew_z_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_flux_valuew_z_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_flux_valuew_z_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj13_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj13_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj13_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj13_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj13_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj13_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj13_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj13_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj13_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj13_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj13_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj13_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj13_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj13_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj13_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj13_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj13_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj13_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj13_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj13_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj13_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj13_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj13_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj13_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj13_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj13_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj13_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj23_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj23_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj23_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj23_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj23_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj23_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj23_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj23_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj23_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj23_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj23_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj23_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj23_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj23_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj23_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj23_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj23_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj23_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj23_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj23_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj23_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj23_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj23_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj23_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj23_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj23_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj23_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxx_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxx_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxx_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxx_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxx_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxx_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxx_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxx_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxx_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxx_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxx_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxx_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxx_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxx_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxx_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxx_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxx_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxx_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxx_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxx_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxx_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxx_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxx_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxx_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxx_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxx_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxx_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxx_xyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxx_xyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxx_xyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxx_xyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxx_xyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxx_xyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxx_xyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxx_xyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxx_xyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxy_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxy_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxy_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxy_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxy_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxy_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxy_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxy_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxy_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxy_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxy_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxy_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxy_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxy_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxy_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxy_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxy_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxy_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxy_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxy_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxy_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxy_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxy_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxy_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxy_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxy_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxy_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxy_xyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxy_xyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxy_xyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxy_xyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxy_xyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxy_xyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxy_xyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxy_xyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxy_xyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_xyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_xyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_xyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_xyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_xyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_xyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_xyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_xyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_xyz_ud7(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux_q(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_setup(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_tend(), scale_atmos_dyn_common::atmos_dyn_prep_pres_linearization(), scale_atmos_dyn::atmos_dyn_setup(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_nextstage(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updateflux(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updatevar(), scale_atmos_dyn_tinteg_short_rk11s8o::atmos_dyn_tinteg_short_rk11s8o(), scale_atmos_dyn_tinteg_short_rk3::atmos_dyn_tinteg_short_rk3(), scale_atmos_dyn_tinteg_short_rk4::atmos_dyn_tinteg_short_rk4(), scale_atmos_dyn_tinteg_short_rk7s6o::atmos_dyn_tinteg_short_rk7s6o(), scale_atmos_dyn_tinteg_tracer_linrk::atmos_dyn_tinteg_tracer_linrk(), scale_atmos_dyn_tinteg_tracer_rk3::atmos_dyn_tinteg_tracer_rk3(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), scale_atmos_dyn_tstep_tracer_fvm_heve::atmos_dyn_tstep_tracer_fvm_heve(), mod_atmos_dyn_vars::atmos_dyn_vars_check(), mod_atmos_dyn_vars::atmos_dyn_vars_fillhalo(), mod_atmos_dyn_vars::atmos_dyn_vars_restart_read(), scale_atmos_dyn_common::atmos_dyn_wdamp_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_generate(), atmos_grid_cartesc_index_setup_main(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_grid_cartesc::atmos_grid_cartesc_output_info(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_areavol(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_z(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_setup(), scale_atmos_grid_icoa_index::atmos_grid_icoa_index_setup(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_adjustment(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_calc_tendency(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_mkinit(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_negative_fixer(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_tendency(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_fillhalo(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_reset_diagnostics(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_restart_read(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_setup(), scale_atmos_phy_bl_mynn::atmos_phy_bl_mynn_tendency(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_calc_tendency(), scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_tendency(), scale_atmos_phy_cp_common::atmos_phy_cp_common_wmean(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_tendency(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_check(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_fillhalo(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_restart_read(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_adjustment(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_setup(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_fillhalo(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_read(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_write(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_adjustment(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_calc_tendency(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc_onlyqv(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_setup(), scale_atmos_phy_mp_common::atmos_phy_mp_negative_fixer(), scale_atmos_phy_mp_common::atmos_phy_mp_precipitation_momentum(), scale_atmos_phy_mp_common::atmos_phy_mp_precipitation_semilag(), scale_atmos_phy_mp_common::atmos_phy_mp_precipitation_upwind(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_calc_tendency(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_setup(), mod_atmos_phy_sf_driver::atmos_phy_sf_driver_calc_tendency(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_flux_phi(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_strain_tensor(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momx(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momy(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momz(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_phi(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980_setup(), scale_atmos_phy_tb_dns::atmos_phy_tb_dns(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_calc_tendency(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_setup(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg_setup(), mod_atmos_driver::atmos_surface_set(), mod_atmos_vars::atmos_vars_calc_diagnostics(), mod_atmos_vars::atmos_vars_check(), mod_atmos_vars::atmos_vars_fillhalo(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_get_diagnostic_2d(), mod_atmos_vars::atmos_vars_get_diagnostic_3d(), mod_atmos_vars::atmos_vars_history_setpres(), mod_atmos_vars::atmos_vars_monitor(), mod_atmos_vars::atmos_vars_restart_check(), mod_atmos_vars::atmos_vars_restart_read(), mod_atmos_vars::atmos_vars_setup(), mod_atmos_bnd_driver::calc_mass(), mod_cnvtopo::cnvtopo_setup(), scale_comm_cartesc_nest::comm_cartesc_nest_domain_shape(), scale_file_cartesc::file_cartesc_read_1d(), scale_file_cartesc::file_cartesc_read_var_2d(), scale_file_cartesc::file_cartesc_read_var_3d(), scale_file_cartesc::file_cartesc_read_var_4d(), scale_file_cartesc::file_cartesc_set_areavol_atmos(), scale_file_cartesc::file_cartesc_set_coordinates_atmos(), scale_file_cartesc::file_cartesc_set_coordinates_urban(), scale_file_cartesc::file_cartesc_write_axes(), scale_file_cartesc::file_cartesc_write_var_1d(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_history_cartesc::file_history_cartesc_set_pres(), scale_file_history_cartesc::file_history_cartesc_truncate_3d(), mod_atmos_phy_lt_driver::history(), mod_atmos_phy_sf_driver::history_output(), scale_atmos_dyn_tstep_short_fvm_hivi::make_matrix(), mod_mkinit::mkinit(), scale_monitor_cartesc::monitor_cartesc_setup(), scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz(), mod_mkinit::read_sounding(), mod_realinput::realinput_atmos(), mod_realinput::realinput_surface(), mod_mkinit::rect_setup(), mod_rm_driver::restart_read(), mod_atmos_bnd_driver::set_boundary(), mod_atmos_bnd_driver::set_offset(), scale_atmos_dyn_tstep_short_fvm_hivi::solve_bicgstab(), scale_atmos_dyn_tstep_short_fvm_hevi::solve_direct(), and scale_atmos_phy_rd_mm5sw::swrad().

◆ is

integer, public scale_atmos_grid_cartesc_index::is

start point of inner domain: x, local

Definition at line 53 of file scale_atmos_grid_cartesC_index.F90.

53  integer, public :: IS

Referenced by mod_atmos_bnd_driver::atmos_boundary_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn::atmos_dyn(), scale_atmos_dyn_common::atmos_dyn_copy_boundary(), scale_atmos_dyn_common::atmos_dyn_copy_boundary_tracer(), scale_atmos_dyn_common::atmos_dyn_divergence(), mod_atmos_dyn_driver::atmos_dyn_driver(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_apply_numfilter(), scale_atmos_dyn_fvm_fct::atmos_dyn_fvm_fct(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux_q(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_setup(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_tend(), scale_atmos_dyn::atmos_dyn_setup(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_nextstage(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updateflux(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updatevar(), scale_atmos_dyn_tinteg_short_rk11s8o::atmos_dyn_tinteg_short_rk11s8o(), scale_atmos_dyn_tinteg_short_rk3::atmos_dyn_tinteg_short_rk3(), scale_atmos_dyn_tinteg_short_rk4::atmos_dyn_tinteg_short_rk4(), scale_atmos_dyn_tinteg_short_rk7s6o::atmos_dyn_tinteg_short_rk7s6o(), scale_atmos_dyn_tinteg_tracer_linrk::atmos_dyn_tinteg_tracer_linrk(), scale_atmos_dyn_tinteg_tracer_rk3::atmos_dyn_tinteg_tracer_rk3(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), scale_atmos_dyn_tstep_tracer_fvm_heve::atmos_dyn_tstep_tracer_fvm_heve(), mod_atmos_dyn_vars::atmos_dyn_vars_check(), mod_atmos_dyn_vars::atmos_dyn_vars_fillhalo(), atmos_grid_cartesc_index_setup_main(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_output_info(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_areavol(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_z(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_setup(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_adjustment(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_calc_tendency(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_mkinit(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_negative_fixer(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_tendency(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_fillhalo(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_reset_diagnostics(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_setup(), scale_atmos_phy_bl_mynn::atmos_phy_bl_mynn_tendency(), mod_atmos_phy_bl_vars::atmos_phy_bl_vars_check(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_calc_tendency(), scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_tendency(), scale_atmos_phy_cp_common::atmos_phy_cp_common_wmean(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_tendency(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_check(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_fillhalo(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_adjustment(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_setup(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_fillhalo(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_read(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_write(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_adjustment(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_calc_tendency(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc_onlyqv(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_setup(), scale_atmos_phy_mp_common::atmos_phy_mp_negative_fixer(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_calc_tendency(), mod_atmos_phy_rd_vars::atmos_phy_rd_vars_check(), mod_atmos_phy_sf_driver::atmos_phy_sf_driver_calc_tendency(), mod_atmos_phy_sf_vars::atmos_phy_sf_vars_check(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_strain_tensor(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980_setup(), scale_atmos_phy_tb_dns::atmos_phy_tb_dns(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_calc_tendency(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_setup(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg_setup(), mod_atmos_driver::atmos_surface_set(), mod_atmos_vars::atmos_vars_check(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_get_diagnostic_2d(), mod_atmos_vars::atmos_vars_get_diagnostic_3d(), mod_atmos_vars::atmos_vars_monitor(), mod_atmos_vars::atmos_vars_restart_check(), mod_atmos_bnd_driver::calc_mass(), mod_cnvlanduse::cnvlanduse(), mod_cnvtopo::cnvtopo(), mod_cnvtopo::cnvtopo_setup(), scale_comm_cartesc_nest::comm_cartesc_nest_domain_shape(), scale_comm_cartesc::comm_horizontal_mean_3d(), scale_comm_cartesc::comm_vars8_init(), scale_comm_cartesc::copy_boundary_2d(), mod_cpl_vars::cpl_getatm_lnd(), mod_cpl_vars::cpl_getatm_ocn(), mod_cpl_vars::cpl_getatm_urb(), mod_cpl_vars::cpl_getsfc_atm(), mod_cpl_vars::cpl_putatm(), mod_cpl_vars::cpl_putlnd(), mod_cpl_vars::cpl_putocn(), mod_cpl_vars::cpl_puturb(), scale_file_cartesc::file_cartesc_setup(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_3d_t(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_history_cartesc::file_history_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_truncate_1d(), scale_file_history_cartesc::file_history_cartesc_truncate_3d(), mod_atmos_phy_lt_driver::history(), mod_atmos_phy_sf_driver::history_output(), scale_land_grid_cartesc_index::land_grid_cartesc_index_setup(), scale_landuse::landuse_fillhalo(), scale_atmos_dyn_tstep_short_fvm_hivi::make_matrix(), mod_mkinit::mkinit(), mod_mktopo::mktopo(), scale_monitor_cartesc::monitor_cartesc_setup(), scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz(), scale_ocean_grid_cartesc_index::ocean_grid_cartesc_index_setup(), scale_comm_cartesc::pack_3d(), mod_mkinit::read_sounding(), mod_mkinit::rect_setup(), mod_rm_driver::restart_read(), mod_atmos_bnd_driver::set_boundary(), mod_atmos_bnd_driver::set_offset(), scale_atmos_dyn_tstep_short_fvm_hivi::solve_bicgstab(), scale_atmos_phy_rd_mm5sw::swrad(), scale_topography::topography_calc_tan_slope(), scale_urban_grid_cartesc_index::urban_grid_cartesc_index_setup(), scale_comm_cartesc::vars8_2d_mpi(), scale_comm_cartesc::vars8_3d_mpi(), and scale_comm_cartesc::vars8_init_mpi_pc().

◆ ie

integer, public scale_atmos_grid_cartesc_index::ie

end point of inner domain: x, local

Definition at line 54 of file scale_atmos_grid_cartesC_index.F90.

54  integer, public :: IE

Referenced by mod_atmos_bnd_driver::atmos_boundary_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn::atmos_dyn(), scale_atmos_dyn_common::atmos_dyn_copy_boundary(), scale_atmos_dyn_common::atmos_dyn_copy_boundary_tracer(), scale_atmos_dyn_common::atmos_dyn_divergence(), mod_atmos_dyn_driver::atmos_dyn_driver(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_apply_numfilter(), scale_atmos_dyn_fvm_fct::atmos_dyn_fvm_fct(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux_q(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_setup(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_tend(), scale_atmos_dyn::atmos_dyn_setup(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_nextstage(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updateflux(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updatevar(), scale_atmos_dyn_tinteg_short_rk11s8o::atmos_dyn_tinteg_short_rk11s8o(), scale_atmos_dyn_tinteg_short_rk3::atmos_dyn_tinteg_short_rk3(), scale_atmos_dyn_tinteg_short_rk4::atmos_dyn_tinteg_short_rk4(), scale_atmos_dyn_tinteg_short_rk7s6o::atmos_dyn_tinteg_short_rk7s6o(), scale_atmos_dyn_tinteg_tracer_linrk::atmos_dyn_tinteg_tracer_linrk(), scale_atmos_dyn_tinteg_tracer_rk3::atmos_dyn_tinteg_tracer_rk3(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), scale_atmos_dyn_tstep_tracer_fvm_heve::atmos_dyn_tstep_tracer_fvm_heve(), mod_atmos_dyn_vars::atmos_dyn_vars_check(), mod_atmos_dyn_vars::atmos_dyn_vars_fillhalo(), atmos_grid_cartesc_index_setup_main(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_output_info(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_areavol(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_z(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_setup(), scale_atmos_grid_icoa_index::atmos_grid_icoa_index_setup(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_adjustment(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_calc_tendency(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_mkinit(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_negative_fixer(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_tendency(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_fillhalo(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_reset_diagnostics(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_setup(), scale_atmos_phy_bl_mynn::atmos_phy_bl_mynn_tendency(), mod_atmos_phy_bl_vars::atmos_phy_bl_vars_check(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_calc_tendency(), scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_tendency(), scale_atmos_phy_cp_common::atmos_phy_cp_common_wmean(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_tendency(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_check(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_fillhalo(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_adjustment(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_setup(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_fillhalo(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_read(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_write(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_adjustment(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_calc_tendency(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc_onlyqv(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_setup(), scale_atmos_phy_mp_common::atmos_phy_mp_negative_fixer(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_calc_tendency(), mod_atmos_phy_rd_vars::atmos_phy_rd_vars_check(), mod_atmos_phy_sf_driver::atmos_phy_sf_driver_calc_tendency(), mod_atmos_phy_sf_vars::atmos_phy_sf_vars_check(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_strain_tensor(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980_setup(), scale_atmos_phy_tb_dns::atmos_phy_tb_dns(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_calc_tendency(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_setup(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg_setup(), mod_atmos_driver::atmos_surface_set(), mod_atmos_vars::atmos_vars_check(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_get_diagnostic_2d(), mod_atmos_vars::atmos_vars_monitor(), mod_atmos_vars::atmos_vars_restart_check(), mod_atmos_bnd_driver::calc_mass(), mod_cnvlanduse::cnvlanduse(), mod_cnvtopo::cnvtopo(), mod_cnvtopo::cnvtopo_setup(), scale_comm_cartesc_nest::comm_cartesc_nest_domain_shape(), scale_comm_cartesc::comm_horizontal_mean_3d(), scale_comm_cartesc::comm_vars8_init(), scale_comm_cartesc::copy_boundary_2d(), mod_cpl_vars::cpl_getatm_lnd(), mod_cpl_vars::cpl_getatm_ocn(), mod_cpl_vars::cpl_getatm_urb(), mod_cpl_vars::cpl_getsfc_atm(), mod_cpl_vars::cpl_putatm(), mod_cpl_vars::cpl_putlnd(), mod_cpl_vars::cpl_putocn(), mod_cpl_vars::cpl_puturb(), scale_file_cartesc::file_cartesc_setup(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_3d_t(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_history_cartesc::file_history_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_truncate_1d(), scale_file_history_cartesc::file_history_cartesc_truncate_3d(), mod_atmos_phy_lt_driver::history(), mod_atmos_phy_sf_driver::history_output(), scale_land_grid_cartesc_index::land_grid_cartesc_index_setup(), scale_landuse::landuse_fillhalo(), scale_atmos_dyn_tstep_short_fvm_hivi::make_matrix(), mod_mkinit::mkinit(), scale_monitor_cartesc::monitor_cartesc_setup(), scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz(), scale_ocean_grid_cartesc_index::ocean_grid_cartesc_index_setup(), scale_comm_cartesc::pack_3d(), mod_mkinit::read_sounding(), mod_mkinit::rect_setup(), mod_rm_driver::restart_read(), mod_atmos_bnd_driver::set_boundary(), mod_atmos_bnd_driver::set_offset(), scale_atmos_dyn_tstep_short_fvm_hivi::solve_bicgstab(), scale_atmos_phy_rd_mm5sw::swrad(), scale_topography::topography_calc_tan_slope(), scale_urban_grid_cartesc_index::urban_grid_cartesc_index_setup(), scale_comm_cartesc::vars8_2d_mpi(), scale_comm_cartesc::vars8_3d_mpi(), and scale_comm_cartesc::vars8_init_mpi_pc().

◆ js

integer, public scale_atmos_grid_cartesc_index::js

start point of inner domain: y, local

Definition at line 55 of file scale_atmos_grid_cartesC_index.F90.

55  integer, public :: JS

Referenced by mod_atmos_bnd_driver::atmos_boundary_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn::atmos_dyn(), scale_atmos_dyn_common::atmos_dyn_copy_boundary(), scale_atmos_dyn_common::atmos_dyn_copy_boundary_tracer(), scale_atmos_dyn_common::atmos_dyn_divergence(), mod_atmos_dyn_driver::atmos_dyn_driver(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_apply_numfilter(), scale_atmos_dyn_fvm_fct::atmos_dyn_fvm_fct(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux_q(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_setup(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_tend(), scale_atmos_dyn::atmos_dyn_setup(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_nextstage(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updateflux(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updatevar(), scale_atmos_dyn_tinteg_short_rk11s8o::atmos_dyn_tinteg_short_rk11s8o(), scale_atmos_dyn_tinteg_short_rk3::atmos_dyn_tinteg_short_rk3(), scale_atmos_dyn_tinteg_short_rk4::atmos_dyn_tinteg_short_rk4(), scale_atmos_dyn_tinteg_short_rk7s6o::atmos_dyn_tinteg_short_rk7s6o(), scale_atmos_dyn_tinteg_tracer_linrk::atmos_dyn_tinteg_tracer_linrk(), scale_atmos_dyn_tinteg_tracer_rk3::atmos_dyn_tinteg_tracer_rk3(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), scale_atmos_dyn_tstep_tracer_fvm_heve::atmos_dyn_tstep_tracer_fvm_heve(), mod_atmos_dyn_vars::atmos_dyn_vars_check(), mod_atmos_dyn_vars::atmos_dyn_vars_fillhalo(), atmos_grid_cartesc_index_setup_main(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_output_info(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_areavol(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_z(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_setup(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_adjustment(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_calc_tendency(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_mkinit(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_negative_fixer(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_tendency(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_fillhalo(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_reset_diagnostics(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_setup(), scale_atmos_phy_bl_mynn::atmos_phy_bl_mynn_tendency(), mod_atmos_phy_bl_vars::atmos_phy_bl_vars_check(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_calc_tendency(), scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_tendency(), scale_atmos_phy_cp_common::atmos_phy_cp_common_wmean(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_tendency(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_check(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_fillhalo(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_adjustment(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_setup(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_fillhalo(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_read(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_write(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_adjustment(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_calc_tendency(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc_onlyqv(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_setup(), scale_atmos_phy_mp_common::atmos_phy_mp_negative_fixer(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_calc_tendency(), mod_atmos_phy_rd_vars::atmos_phy_rd_vars_check(), mod_atmos_phy_sf_driver::atmos_phy_sf_driver_calc_tendency(), mod_atmos_phy_sf_vars::atmos_phy_sf_vars_check(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_strain_tensor(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980_setup(), scale_atmos_phy_tb_dns::atmos_phy_tb_dns(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_calc_tendency(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_setup(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg_setup(), mod_atmos_driver::atmos_surface_set(), mod_atmos_vars::atmos_vars_check(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_get_diagnostic_2d(), mod_atmos_vars::atmos_vars_monitor(), mod_atmos_vars::atmos_vars_restart_check(), mod_atmos_bnd_driver::calc_mass(), mod_cnvlanduse::cnvlanduse(), mod_cnvtopo::cnvtopo(), mod_cnvtopo::cnvtopo_setup(), scale_comm_cartesc_nest::comm_cartesc_nest_domain_shape(), scale_comm_cartesc::comm_horizontal_mean_3d(), scale_comm_cartesc::comm_vars8_init(), scale_comm_cartesc::copy_boundary_2d(), mod_cpl_vars::cpl_getatm_lnd(), mod_cpl_vars::cpl_getatm_ocn(), mod_cpl_vars::cpl_getatm_urb(), mod_cpl_vars::cpl_getsfc_atm(), mod_cpl_vars::cpl_putatm(), mod_cpl_vars::cpl_putlnd(), mod_cpl_vars::cpl_putocn(), mod_cpl_vars::cpl_puturb(), scale_file_cartesc::file_cartesc_setup(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_3d_t(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_history_cartesc::file_history_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_truncate_1d(), scale_file_history_cartesc::file_history_cartesc_truncate_3d(), mod_atmos_phy_lt_driver::history(), mod_atmos_phy_sf_driver::history_output(), scale_land_grid_cartesc_index::land_grid_cartesc_index_setup(), scale_landuse::landuse_fillhalo(), scale_atmos_dyn_tstep_short_fvm_hivi::make_matrix(), mod_mkinit::mkinit(), mod_mktopo::mktopo(), scale_monitor_cartesc::monitor_cartesc_setup(), scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz(), scale_ocean_grid_cartesc_index::ocean_grid_cartesc_index_setup(), scale_comm_cartesc::pack_3d(), mod_mkinit::read_sounding(), mod_mkinit::rect_setup(), mod_rm_driver::restart_read(), mod_atmos_bnd_driver::set_boundary(), mod_atmos_bnd_driver::set_offset(), scale_atmos_dyn_tstep_short_fvm_hivi::solve_bicgstab(), scale_atmos_phy_rd_mm5sw::swrad(), scale_topography::topography_calc_tan_slope(), scale_urban_grid_cartesc_index::urban_grid_cartesc_index_setup(), scale_comm_cartesc::vars8_2d_mpi(), scale_comm_cartesc::vars8_3d_mpi(), scale_comm_cartesc::vars8_init_mpi_pc(), scale_comm_cartesc::vars_2d_mpi(), scale_comm_cartesc::vars_3d_mpi(), and scale_comm_cartesc::vars_init_mpi_pc().

◆ je

integer, public scale_atmos_grid_cartesc_index::je

end point of inner domain: y, local

Definition at line 56 of file scale_atmos_grid_cartesC_index.F90.

56  integer, public :: JE

Referenced by mod_atmos_bnd_driver::atmos_boundary_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn::atmos_dyn(), scale_atmos_dyn_common::atmos_dyn_copy_boundary(), scale_atmos_dyn_common::atmos_dyn_copy_boundary_tracer(), scale_atmos_dyn_common::atmos_dyn_divergence(), mod_atmos_dyn_driver::atmos_dyn_driver(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_apply_numfilter(), scale_atmos_dyn_fvm_fct::atmos_dyn_fvm_fct(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_flux_q(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_setup(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_numfilter_tend(), scale_atmos_dyn::atmos_dyn_setup(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_nextstage(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updateflux(), scale_atmos_dyn_tinteg_rkcommon::atmos_dyn_tinteg_rkcommon_updatevar(), scale_atmos_dyn_tinteg_short_rk11s8o::atmos_dyn_tinteg_short_rk11s8o(), scale_atmos_dyn_tinteg_short_rk3::atmos_dyn_tinteg_short_rk3(), scale_atmos_dyn_tinteg_short_rk4::atmos_dyn_tinteg_short_rk4(), scale_atmos_dyn_tinteg_short_rk7s6o::atmos_dyn_tinteg_short_rk7s6o(), scale_atmos_dyn_tinteg_tracer_linrk::atmos_dyn_tinteg_tracer_linrk(), scale_atmos_dyn_tinteg_tracer_rk3::atmos_dyn_tinteg_tracer_rk3(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), scale_atmos_dyn_tstep_tracer_fvm_heve::atmos_dyn_tstep_tracer_fvm_heve(), mod_atmos_dyn_vars::atmos_dyn_vars_check(), mod_atmos_dyn_vars::atmos_dyn_vars_fillhalo(), atmos_grid_cartesc_index_setup_main(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_setup(), scale_atmos_grid_cartesc::atmos_grid_cartesc_output_info(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_areavol(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_calc_z(), scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_setup(), scale_atmos_grid_icoa_index::atmos_grid_icoa_index_setup(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_adjustment(), mod_atmos_phy_ae_driver::atmos_phy_ae_driver_calc_tendency(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_mkinit(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_negative_fixer(), scale_atmos_phy_ae_kajino13::atmos_phy_ae_kajino13_tendency(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_fillhalo(), mod_atmos_phy_ae_vars::atmos_phy_ae_vars_reset_diagnostics(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_setup(), scale_atmos_phy_bl_mynn::atmos_phy_bl_mynn_tendency(), mod_atmos_phy_bl_vars::atmos_phy_bl_vars_check(), mod_atmos_phy_ch_driver::atmos_phy_ch_driver_calc_tendency(), scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_tendency(), scale_atmos_phy_cp_common::atmos_phy_cp_common_wmean(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_setup(), scale_atmos_phy_cp_kf::atmos_phy_cp_kf_tendency(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_check(), mod_atmos_phy_cp_vars::atmos_phy_cp_vars_fillhalo(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_adjustment(), mod_atmos_phy_lt_driver::atmos_phy_lt_driver_setup(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_fillhalo(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_read(), mod_atmos_phy_lt_vars::atmos_phy_lt_vars_restart_write(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_adjustment(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_calc_tendency(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_qhyd2qtrc_onlyqv(), mod_atmos_phy_mp_driver::atmos_phy_mp_driver_setup(), scale_atmos_phy_mp_common::atmos_phy_mp_negative_fixer(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_phy_rd_driver::atmos_phy_rd_driver_calc_tendency(), mod_atmos_phy_rd_vars::atmos_phy_rd_vars_check(), mod_atmos_phy_sf_driver::atmos_phy_sf_driver_calc_tendency(), mod_atmos_phy_sf_vars::atmos_phy_sf_vars_check(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_strain_tensor(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980_setup(), scale_atmos_phy_tb_dns::atmos_phy_tb_dns(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_calc_tendency(), mod_atmos_phy_tb_driver::atmos_phy_tb_driver_setup(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg_setup(), mod_atmos_driver::atmos_surface_set(), mod_atmos_vars::atmos_vars_check(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_get_diagnostic_2d(), mod_atmos_vars::atmos_vars_monitor(), mod_atmos_vars::atmos_vars_restart_check(), mod_atmos_bnd_driver::calc_mass(), mod_cnvlanduse::cnvlanduse(), mod_cnvtopo::cnvtopo(), mod_cnvtopo::cnvtopo_setup(), scale_comm_cartesc_nest::comm_cartesc_nest_domain_shape(), scale_comm_cartesc::comm_horizontal_mean_3d(), scale_comm_cartesc::comm_vars8_init(), scale_comm_cartesc::copy_boundary_2d(), mod_cpl_vars::cpl_getatm_lnd(), mod_cpl_vars::cpl_getatm_ocn(), mod_cpl_vars::cpl_getatm_urb(), mod_cpl_vars::cpl_getsfc_atm(), mod_cpl_vars::cpl_putatm(), mod_cpl_vars::cpl_putlnd(), mod_cpl_vars::cpl_putocn(), mod_cpl_vars::cpl_puturb(), scale_file_cartesc::file_cartesc_setup(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_3d_t(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_history_cartesc::file_history_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_truncate_1d(), scale_file_history_cartesc::file_history_cartesc_truncate_3d(), mod_atmos_phy_lt_driver::history(), mod_atmos_phy_sf_driver::history_output(), scale_land_grid_cartesc_index::land_grid_cartesc_index_setup(), scale_landuse::landuse_fillhalo(), scale_atmos_dyn_tstep_short_fvm_hivi::make_matrix(), mod_mkinit::mkinit(), scale_monitor_cartesc::monitor_cartesc_setup(), scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz(), scale_ocean_grid_cartesc_index::ocean_grid_cartesc_index_setup(), scale_comm_cartesc::pack_3d(), mod_mkinit::rect_setup(), mod_rm_driver::restart_read(), mod_atmos_bnd_driver::set_boundary(), mod_atmos_bnd_driver::set_offset(), scale_atmos_dyn_tstep_short_fvm_hivi::solve_bicgstab(), scale_atmos_phy_rd_mm5sw::swrad(), scale_topography::topography_calc_tan_slope(), scale_urban_grid_cartesc_index::urban_grid_cartesc_index_setup(), scale_comm_cartesc::vars8_2d_mpi(), scale_comm_cartesc::vars8_3d_mpi(), scale_comm_cartesc::vars8_init_mpi_pc(), scale_comm_cartesc::vars_2d_mpi(), scale_comm_cartesc::vars_3d_mpi(), and scale_comm_cartesc::vars_init_mpi_pc().

◆ kijmax

integer, public scale_atmos_grid_cartesc_index::kijmax = -1

◆ imaxb

integer, public scale_atmos_grid_cartesc_index::imaxb

◆ jmaxb

integer, public scale_atmos_grid_cartesc_index::jmaxb

◆ isb

integer, public scale_atmos_grid_cartesc_index::isb

Definition at line 63 of file scale_atmos_grid_cartesC_index.F90.

63  integer, public :: ISB

Referenced by mod_atmos_bnd_driver::atmos_boundary_driver_set(), mod_atmos_driver::atmos_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), atmos_grid_cartesc_index_setup_main(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_vars::atmos_vars_fillhalo(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_history_setpres(), scale_file_cartesc::construct_derived_datatype(), mod_copytopo::copytopo(), scale_file_cartesc::file_cartesc_read_1d(), scale_file_cartesc::file_cartesc_read_var_2d(), scale_file_cartesc::file_cartesc_read_var_3d(), scale_file_cartesc::file_cartesc_read_var_4d(), scale_file_cartesc::file_cartesc_set_coordinates_urban(), scale_file_cartesc::file_cartesc_write_axes(), scale_file_cartesc::file_cartesc_write_var_1d(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_3d_t(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_external_input_cartesc::file_external_input_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_set_pres(), scale_file_history_cartesc::file_history_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_truncate_3d(), mod_mkinit::flux_setup(), mod_realinput::land_interporation(), scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz(), mod_realinput::ocean_interporation(), mod_mkinit::read_sounding(), mod_realinput::realinput_surface(), mod_mkinit::rect_setup(), and mod_rm_driver::restart_read().

◆ ieb

integer, public scale_atmos_grid_cartesc_index::ieb

Definition at line 64 of file scale_atmos_grid_cartesC_index.F90.

64  integer, public :: IEB

Referenced by mod_atmos_bnd_driver::atmos_boundary_driver_set(), mod_atmos_driver::atmos_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), atmos_grid_cartesc_index_setup_main(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_vars::atmos_vars_fillhalo(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_history_setpres(), mod_copytopo::copytopo(), scale_file_cartesc::file_cartesc_read_1d(), scale_file_cartesc::file_cartesc_read_var_2d(), scale_file_cartesc::file_cartesc_read_var_3d(), scale_file_cartesc::file_cartesc_read_var_4d(), scale_file_cartesc::file_cartesc_set_coordinates_urban(), scale_file_cartesc::file_cartesc_write_axes(), scale_file_cartesc::file_cartesc_write_var_1d(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_3d_t(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_history_cartesc::file_history_cartesc_set_pres(), scale_file_history_cartesc::file_history_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_truncate_3d(), mod_mkinit::flux_setup(), mod_realinput::land_interporation(), scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz(), mod_realinput::ocean_interporation(), mod_mkinit::read_sounding(), mod_realinput::realinput_surface(), mod_mkinit::rect_setup(), and mod_rm_driver::restart_read().

◆ jsb

integer, public scale_atmos_grid_cartesc_index::jsb

Definition at line 65 of file scale_atmos_grid_cartesC_index.F90.

65  integer, public :: JSB

Referenced by mod_atmos_bnd_driver::atmos_boundary_driver_set(), mod_atmos_driver::atmos_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), atmos_grid_cartesc_index_setup_main(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_vars::atmos_vars_fillhalo(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_history_setpres(), mod_copytopo::copytopo(), scale_file_cartesc::file_cartesc_read_1d(), scale_file_cartesc::file_cartesc_read_var_2d(), scale_file_cartesc::file_cartesc_read_var_3d(), scale_file_cartesc::file_cartesc_read_var_4d(), scale_file_cartesc::file_cartesc_set_coordinates_urban(), scale_file_cartesc::file_cartesc_write_axes(), scale_file_cartesc::file_cartesc_write_var_1d(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_3d_t(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_external_input_cartesc::file_external_input_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_set_pres(), scale_file_history_cartesc::file_history_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_truncate_3d(), mod_mkinit::flux_setup(), mod_realinput::land_interporation(), scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz(), mod_realinput::ocean_interporation(), mod_mkinit::read_sounding(), mod_realinput::realinput_surface(), mod_mkinit::rect_setup(), and mod_rm_driver::restart_read().

◆ jeb

integer, public scale_atmos_grid_cartesc_index::jeb

Definition at line 66 of file scale_atmos_grid_cartesC_index.F90.

66  integer, public :: JEB

Referenced by mod_atmos_bnd_driver::atmos_boundary_driver_set(), mod_atmos_driver::atmos_driver_setup(), mod_atmos_driver::atmos_driver_update(), scale_atmos_dyn_common::atmos_dyn_fill_halo(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), atmos_grid_cartesc_index_setup_main(), mod_atmos_phy_bl_driver::atmos_phy_bl_driver_calc_tendency(), mod_atmos_phy_cp_driver::atmos_phy_cp_driver_calc_tendency(), mod_atmos_phy_mp_vars::atmos_phy_mp_vars_get_diagnostic(), mod_atmos_vars::atmos_vars_fillhalo(), mod_atmos_vars::atmos_vars_get_diagnostic_1d(), mod_atmos_vars::atmos_vars_history_setpres(), mod_copytopo::copytopo(), scale_file_cartesc::file_cartesc_read_1d(), scale_file_cartesc::file_cartesc_read_var_2d(), scale_file_cartesc::file_cartesc_read_var_3d(), scale_file_cartesc::file_cartesc_read_var_4d(), scale_file_cartesc::file_cartesc_set_coordinates_urban(), scale_file_cartesc::file_cartesc_write_axes(), scale_file_cartesc::file_cartesc_write_var_1d(), scale_file_cartesc::file_cartesc_write_var_2d(), scale_file_cartesc::file_cartesc_write_var_3d(), scale_file_cartesc::file_cartesc_write_var_3d_t(), scale_file_cartesc::file_cartesc_write_var_4d(), scale_file_history_cartesc::file_history_cartesc_set_pres(), scale_file_history_cartesc::file_history_cartesc_setup(), scale_file_history_cartesc::file_history_cartesc_truncate_3d(), mod_mkinit::flux_setup(), mod_realinput::land_interporation(), scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz(), mod_realinput::ocean_interporation(), mod_mkinit::read_sounding(), mod_realinput::realinput_surface(), mod_mkinit::rect_setup(), and mod_rm_driver::restart_read().

◆ ieh

integer, public scale_atmos_grid_cartesc_index::ieh

◆ jeh

integer, public scale_atmos_grid_cartesc_index::jeh

◆ imaxg

integer, public scale_atmos_grid_cartesc_index::imaxg = -1

◆ jmaxg

integer, public scale_atmos_grid_cartesc_index::jmaxg = -1

◆ iag

integer, public scale_atmos_grid_cartesc_index::iag

◆ jag

integer, public scale_atmos_grid_cartesc_index::jag

◆ iagb

integer, public scale_atmos_grid_cartesc_index::iagb

of computational grids

Definition at line 75 of file scale_atmos_grid_cartesC_index.F90.

75  integer, public :: IAGB

Referenced by atmos_grid_cartesc_index_setup_main(), and scale_file_history_cartesc::file_history_cartesc_truncate_3d().

◆ jagb

integer, public scale_atmos_grid_cartesc_index::jagb

of computational grids

Definition at line 76 of file scale_atmos_grid_cartesC_index.F90.

76  integer, public :: JAGB

Referenced by atmos_grid_cartesc_index_setup_main(), and scale_file_history_cartesc::file_history_cartesc_truncate_3d().

◆ is_ing

integer, public scale_atmos_grid_cartesc_index::is_ing

◆ ie_ing

integer, public scale_atmos_grid_cartesc_index::ie_ing

end point of the inner domain: cx, global

Definition at line 78 of file scale_atmos_grid_cartesC_index.F90.

78  integer, public :: IE_inG

Referenced by atmos_grid_cartesc_index_setup_main(), scale_file_cartesc::file_cartesc_write_axes(), and scale_file_history_cartesc::file_history_cartesc_truncate_3d().

◆ js_ing

integer, public scale_atmos_grid_cartesc_index::js_ing

◆ je_ing

integer, public scale_atmos_grid_cartesc_index::je_ing

end point of the inner domain: cy, global

Definition at line 80 of file scale_atmos_grid_cartesC_index.F90.

80  integer, public :: JE_inG

Referenced by atmos_grid_cartesc_index_setup_main(), scale_file_cartesc::file_cartesc_write_axes(), and scale_file_history_cartesc::file_history_cartesc_truncate_3d().

◆ isga

integer, public scale_atmos_grid_cartesc_index::isga

◆ iega

integer, public scale_atmos_grid_cartesc_index::iega

end point of the full domain: cx, global

Definition at line 82 of file scale_atmos_grid_cartesC_index.F90.

82  integer, public :: IEGA

Referenced by atmos_grid_cartesc_index_setup_main().

◆ jsga

integer, public scale_atmos_grid_cartesc_index::jsga

◆ jega

integer, public scale_atmos_grid_cartesc_index::jega

end point of the full domain: cy, global

Definition at line 84 of file scale_atmos_grid_cartesC_index.F90.

84  integer, public :: JEGA

Referenced by atmos_grid_cartesc_index_setup_main().

◆ isgb

integer, public scale_atmos_grid_cartesc_index::isgb

◆ iegb

integer, public scale_atmos_grid_cartesc_index::iegb

end point of the inner domain: x, global

Definition at line 86 of file scale_atmos_grid_cartesC_index.F90.

86  integer, public :: IEGB

Referenced by atmos_grid_cartesc_index_setup_main().

◆ jsgb

integer, public scale_atmos_grid_cartesc_index::jsgb

◆ jegb

integer, public scale_atmos_grid_cartesc_index::jegb

end point of the inner domain: y, global

Definition at line 88 of file scale_atmos_grid_cartesC_index.F90.

88  integer, public :: JEGB

Referenced by atmos_grid_cartesc_index_setup_main().

◆ i_xyz

integer, public scale_atmos_grid_cartesc_index::i_xyz = 1

Definition at line 90 of file scale_atmos_grid_cartesC_index.F90.

90  integer, public :: I_XYZ = 1 ! at (x,y,z)

Referenced by scale_atmos_diagnostic_cartesc::atmos_diagnostic_cartesc_get_vel(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_apply_numfilter(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj23_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj23_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj23_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj23_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj23_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj23_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj23_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj23_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj23_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_uyz_ud7(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), scale_atmos_dyn_tstep_tracer_fvm_heve::atmos_dyn_tstep_tracer_fvm_heve(), atmos_grid_cartesc_index_setup(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_phy_lt_sato2019::atmos_phy_lt_electric_field(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_flux_phi(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_strain_tensor(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momx(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momy(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momz(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_phi(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), scale_atmos_phy_lt_sato2019::mul_matrix(), and scale_atmos_dyn_tstep_short_fvm_hevi::solve_direct().

◆ i_xyw

integer, public scale_atmos_grid_cartesc_index::i_xyw = 2

◆ i_uyw

integer, public scale_atmos_grid_cartesc_index::i_uyw = 3

◆ i_xvw

integer, public scale_atmos_grid_cartesc_index::i_xvw = 4

◆ i_uyz

integer, public scale_atmos_grid_cartesc_index::i_uyz = 5

Definition at line 94 of file scale_atmos_grid_cartesC_index.F90.

94  integer, public :: I_UYZ = 5 ! at (u,y,z)

Referenced by scale_atmos_dyn_common::atmos_dyn_divergence(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_apply_numfilter(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj13_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj13_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj13_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj13_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj13_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj13_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj13_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj13_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj13_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj23_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj23_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj23_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj23_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj23_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj23_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj23_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj23_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj23_uyz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxx_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxx_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxx_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxx_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxx_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxx_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxx_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxx_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxx_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_uyz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_uyz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_uyz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_uyz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_uyz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_uyz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_uyz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_uyz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_uyz_ud7(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), scale_atmos_dyn_tstep_tracer_fvm_heve::atmos_dyn_tstep_tracer_fvm_heve(), atmos_grid_cartesc_index_setup(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_phy_lt_sato2019::atmos_phy_lt_electric_field(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_flux_phi(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_strain_tensor(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momx(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_phi(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), and scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz().

◆ i_xvz

integer, public scale_atmos_grid_cartesc_index::i_xvz = 6

Definition at line 95 of file scale_atmos_grid_cartesC_index.F90.

95  integer, public :: I_XVZ = 6 ! at (x,v,z)

Referenced by scale_atmos_dyn_common::atmos_dyn_divergence(), scale_atmos_dyn_fvm_numfilter::atmos_dyn_fvm_apply_numfilter(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj13_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj13_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj13_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj13_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj13_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj13_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj13_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj13_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj13_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxj23_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxj23_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxj23_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxj23_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxj23_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxj23_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxj23_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxj23_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxj23_xvz_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxy_xyw_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxy_xyw_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxy_xyw_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxy_xyw_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxy_xyw_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxy_xyw_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxy_xyw_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxy_xyw_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxy_xyw_ud7(), scale_atmos_dyn_fvm_flux_cd2::atmos_dyn_fvm_fluxz_xvz_cd2(), scale_atmos_dyn_fvm_flux_cd4::atmos_dyn_fvm_fluxz_xvz_cd4(), scale_atmos_dyn_fvm_flux_cd6::atmos_dyn_fvm_fluxz_xvz_cd6(), scale_atmos_dyn_fvm_flux_cd8::atmos_dyn_fvm_fluxz_xvz_cd8(), scale_atmos_dyn_fvm_flux_ud1::atmos_dyn_fvm_fluxz_xvz_ud1(), scale_atmos_dyn_fvm_flux_ud3::atmos_dyn_fvm_fluxz_xvz_ud3(), scale_atmos_dyn_fvm_flux_ud3koren1993::atmos_dyn_fvm_fluxz_xvz_ud3koren1993(), scale_atmos_dyn_fvm_flux_ud5::atmos_dyn_fvm_fluxz_xvz_ud5(), scale_atmos_dyn_fvm_flux_ud7::atmos_dyn_fvm_fluxz_xvz_ud7(), scale_atmos_dyn_tstep_large_fvm_heve::atmos_dyn_tstep_large_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_heve::atmos_dyn_tstep_short_fvm_heve(), scale_atmos_dyn_tstep_short_fvm_hevi::atmos_dyn_tstep_short_fvm_hevi(), scale_atmos_dyn_tstep_short_fvm_hivi::atmos_dyn_tstep_short_fvm_hivi(), scale_atmos_dyn_tstep_tracer_fvm_heve::atmos_dyn_tstep_tracer_fvm_heve(), atmos_grid_cartesc_index_setup(), scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef(), scale_atmos_phy_lt_sato2019::atmos_phy_lt_electric_field(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_flux_phi(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_strain_tensor(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_momy(), scale_atmos_phy_tb_common::atmos_phy_tb_calc_tend_phi(), scale_atmos_phy_tb_d1980::atmos_phy_tb_d1980(), scale_atmos_phy_tb_smg::atmos_phy_tb_smg(), and scale_atmos_dyn_tstep_large_fvm_heve::multiply_flux_by_metric_xyz().

◆ i_uvz

integer, public scale_atmos_grid_cartesc_index::i_uvz = 7

◆ i_xy

integer, public scale_atmos_grid_cartesc_index::i_xy = 1

◆ i_uy

integer, public scale_atmos_grid_cartesc_index::i_uy = 2

◆ i_xv

integer, public scale_atmos_grid_cartesc_index::i_xv = 3

◆ i_uv

integer, public scale_atmos_grid_cartesc_index::i_uv = 4

◆ i_fyz

integer, public scale_atmos_grid_cartesc_index::i_fyz = 1

Definition at line 103 of file scale_atmos_grid_cartesC_index.F90.

103  integer, public :: I_FYZ = 1 ! y-z face limiting x-flux

Referenced by scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef().

◆ i_fxz

integer, public scale_atmos_grid_cartesc_index::i_fxz = 2

Definition at line 104 of file scale_atmos_grid_cartesC_index.F90.

104  integer, public :: I_FXZ = 2 ! x-z face limiting y-flux

Referenced by scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef().

◆ i_fxy

integer, public scale_atmos_grid_cartesc_index::i_fxy = 3

Definition at line 105 of file scale_atmos_grid_cartesC_index.F90.

105  integer, public :: I_FXY = 3 ! x-y face limiting z-flux

Referenced by scale_atmos_grid_cartesc_metric::atmos_grid_cartesc_metric_rotcoef().

scale_atmos_grid_cartesc_index::isb
integer, public isb
Definition: scale_atmos_grid_cartesC_index.F90:63
scale_atmos_grid_cartesc_index::jagb
integer, public jagb
Definition: scale_atmos_grid_cartesC_index.F90:76
scale_atmos_grid_cartesc_index::i_uy
integer, public i_uy
Definition: scale_atmos_grid_cartesC_index.F90:99
scale_atmos_grid_cartesc_index::ke
integer, public ke
end point of inner domain: z, local
Definition: scale_atmos_grid_cartesC_index.F90:52
scale_atmos_grid_cartesc_index::i_xv
integer, public i_xv
Definition: scale_atmos_grid_cartesC_index.F90:100
scale_prc::prc_abort
subroutine, public prc_abort
Abort Process.
Definition: scale_prc.F90:342
scale_atmos_grid_cartesc_index::iega
integer, public iega
end point of the full domain: cx, global
Definition: scale_atmos_grid_cartesC_index.F90:82
scale_atmos_grid_cartesc_index::jmaxb
integer, public jmaxb
Definition: scale_atmos_grid_cartesC_index.F90:62
scale_prc_cartesc::prc_has_s
logical, public prc_has_s
Definition: scale_prc_cartesC.F90:50
scale_prc_cartesc::prc_periodic_y
logical, public prc_periodic_y
periodic condition or not (Y)?
Definition: scale_prc_cartesC.F90:53
scale_atmos_grid_cartesc_index::isga
integer, public isga
start point of the full domain: cx, global
Definition: scale_atmos_grid_cartesC_index.F90:81
scale_atmos_grid_cartesc_index::isgb
integer, public isgb
start point of the inner domain: x, global
Definition: scale_atmos_grid_cartesC_index.F90:85
scale_atmos_grid_cartesc_index::i_uv
integer, public i_uv
Definition: scale_atmos_grid_cartesC_index.F90:101
scale_atmos_grid_cartesc_index::iegb
integer, public iegb
end point of the inner domain: x, global
Definition: scale_atmos_grid_cartesC_index.F90:86
scale_prc::prc_myrank
integer, public prc_myrank
process num in local communicator
Definition: scale_prc.F90:90
scale_atmos_grid_cartesc_index::jega
integer, public jega
end point of the full domain: cy, global
Definition: scale_atmos_grid_cartesC_index.F90:84
scale_atmos_grid_cartesc_index::jeh
integer, public jeh
end point of inner domain: y, local (half level)
Definition: scale_atmos_grid_cartesC_index.F90:68
scale_atmos_grid_cartesc_index::je_ing
integer, public je_ing
end point of the inner domain: cy, global
Definition: scale_atmos_grid_cartesC_index.F90:80
scale_atmos_grid_cartesc_index::jsgb
integer, public jsgb
start point of the inner domain: y, global
Definition: scale_atmos_grid_cartesC_index.F90:87
scale_prc_cartesc::prc_has_n
logical, public prc_has_n
Definition: scale_prc_cartesC.F90:48
scale_atmos_grid_cartesc_index::jeb
integer, public jeb
Definition: scale_atmos_grid_cartesC_index.F90:66
scale_atmos_grid_cartesc_index::i_xyz
integer, public i_xyz
Definition: scale_atmos_grid_cartesC_index.F90:90
scale_prc_cartesc::prc_has_e
logical, public prc_has_e
Definition: scale_prc_cartesC.F90:49
scale_prc
module PROCESS
Definition: scale_prc.F90:11
scale_atmos_grid_cartesc_index::jegb
integer, public jegb
end point of the inner domain: y, global
Definition: scale_atmos_grid_cartesC_index.F90:88
scale_atmos_grid_cartesc_index::i_xy
integer, public i_xy
Definition: scale_atmos_grid_cartesC_index.F90:98
scale_atmos_grid_cartesc_index::ie
integer, public ie
end point of inner domain: x, local
Definition: scale_atmos_grid_cartesC_index.F90:54
scale_atmos_grid_cartesc_index::i_uyz
integer, public i_uyz
Definition: scale_atmos_grid_cartesC_index.F90:94
scale_atmos_grid_cartesc_index::jag
integer, public jag
Definition: scale_atmos_grid_cartesC_index.F90:74
scale_atmos_grid_cartesc_index::iag
integer, public iag
Definition: scale_atmos_grid_cartesC_index.F90:73
scale_prc_cartesc::prc_periodic_x
logical, public prc_periodic_x
periodic condition or not (X)?
Definition: scale_prc_cartesC.F90:52
scale_atmos_grid_cartesc_index::js_ing
integer, public js_ing
start point of the inner domain: cy, global
Definition: scale_atmos_grid_cartesC_index.F90:79
scale_atmos_grid_cartesc_index::i_xvw
integer, public i_xvw
Definition: scale_atmos_grid_cartesC_index.F90:93
scale_atmos_grid_cartesc_index::ie_ing
integer, public ie_ing
end point of the inner domain: cx, global
Definition: scale_atmos_grid_cartesC_index.F90:78
scale_prc_cartesc::prc_2drank
integer, dimension(:,:), allocatable, public prc_2drank
node index in 2D topology
Definition: scale_prc_cartesC.F90:44
scale_atmos_grid_cartesc_index::is_ing
integer, public is_ing
start point of the inner domain: cx, global
Definition: scale_atmos_grid_cartesC_index.F90:77
scale_atmos_grid_cartesc_index::i_xvz
integer, public i_xvz
Definition: scale_atmos_grid_cartesC_index.F90:95
scale_prc_cartesc
module process / cartesC
Definition: scale_prc_cartesC.F90:11
scale_atmos_grid_cartesc_index::ieh
integer, public ieh
end point of inner domain: x, local (half level)
Definition: scale_atmos_grid_cartesC_index.F90:67
scale_atmos_grid_cartesc_index::i_uyw
integer, public i_uyw
Definition: scale_atmos_grid_cartesC_index.F90:92
scale_atmos_grid_cartesc_index::is
integer, public is
start point of inner domain: x, local
Definition: scale_atmos_grid_cartesC_index.F90:53
scale_atmos_grid_cartesc_index::ks
integer, public ks
start point of inner domain: z, local
Definition: scale_atmos_grid_cartesC_index.F90:51
scale_atmos_grid_cartesc_index::imaxb
integer, public imaxb
Definition: scale_atmos_grid_cartesC_index.F90:61
scale_atmos_grid_cartesc_index::iagb
integer, public iagb
Definition: scale_atmos_grid_cartesC_index.F90:75
scale_atmos_grid_cartesc_index::js
integer, public js
start point of inner domain: y, local
Definition: scale_atmos_grid_cartesC_index.F90:55
scale_prc_cartesc::prc_num_y
integer, public prc_num_y
y length of 2D processor topology
Definition: scale_prc_cartesC.F90:42
scale_atmos_grid_cartesc_index::ieb
integer, public ieb
Definition: scale_atmos_grid_cartesC_index.F90:64
scale_prc_cartesc::prc_num_x
integer, public prc_num_x
x length of 2D processor topology
Definition: scale_prc_cartesC.F90:41
scale_atmos_grid_cartesc_index::atmos_grid_cartesc_index_setup_main
subroutine atmos_grid_cartesc_index_setup_main(KMAX_in, IMAXG_in, JMAXG_in, IMAX_in, JMAX_in, KHALO_in, IHALO_in, JHALO_in, IBLOCK_in, JBLOCK_in)
Definition: scale_atmos_grid_cartesC_index.F90:157
scale_atmos_grid_cartesc_index::i_uvz
integer, public i_uvz
Definition: scale_atmos_grid_cartesC_index.F90:96
scale_atmos_grid_cartesc_index::jsb
integer, public jsb
Definition: scale_atmos_grid_cartesC_index.F90:65
scale_prc_cartesc::prc_has_w
logical, public prc_has_w
Definition: scale_prc_cartesC.F90:47
scale_atmos_grid_cartesc_index::kijmax
integer, public kijmax
Definition: scale_atmos_grid_cartesC_index.F90:58
scale_atmos_grid_cartesc_index::je
integer, public je
end point of inner domain: y, local
Definition: scale_atmos_grid_cartesC_index.F90:56
scale_prc_cartesc::prc_twod
logical, public prc_twod
2D experiment
Definition: scale_prc_cartesC.F90:55
scale_atmos_grid_cartesc_index::jsga
integer, public jsga
start point of the full domain: cy, global
Definition: scale_atmos_grid_cartesC_index.F90:83
scale_atmos_grid_cartesc_index::i_xyw
integer, public i_xyw
Definition: scale_atmos_grid_cartesC_index.F90:91