SCALE-RM
mod_atmos_phy_ch_driver.F90
Go to the documentation of this file.
1 !-------------------------------------------------------------------------------
10 !-------------------------------------------------------------------------------
11 #include "scalelib.h"
13  !-----------------------------------------------------------------------------
14  !
15  !++ used modules
16  !
17  use scale_precision
18  use scale_io
19  use scale_prof
21  use scale_tracer
22  !-----------------------------------------------------------------------------
23  implicit none
24  private
25  !-----------------------------------------------------------------------------
26  !
27  !++ Public procedure
28  !
36 
37  !-----------------------------------------------------------------------------
38  !
39  !++ Public parameters & variables
40  !
41  !-----------------------------------------------------------------------------
42  !
43  !++ Private procedure
44  !
45  !-----------------------------------------------------------------------------
46  !
47  !++ Private parameters & variables
48  !
49  !-----------------------------------------------------------------------------
50 contains
51  !-----------------------------------------------------------------------------
54  use mod_atmos_admin, only: &
57  use scale_tracer, only: &
59  use scale_atmos_phy_ch_rn222, only: &
64  use mod_atmos_phy_ch_vars, only: &
65  qa_ch, &
66  qs_ch, &
67  qe_ch
68  use scale_prc, only: &
69  prc_abort
70  implicit none
71  !---------------------------------------------------------------------------
72 
73  log_newline
74  log_info("ATMOS_PHY_CH_driver_tracer_setup",*) 'Setup'
75 
76  if ( atmos_sw_phy_ch ) then
77 
78  select case ( atmos_phy_ch_type )
79  case ( 'OFF', 'NONE' )
80  log_info("ATMOS_PHY_CH_driver_tracer_setup",*) 'this component is never called.'
81  case ( 'RN222' )
82 
83  call tracer_regist( qs_ch, & ! [OUT]
85  atmos_phy_ch_rn222_name(:), & ! [IN]
86  atmos_phy_ch_rn222_desc(:), & ! [IN]
87  atmos_phy_ch_rn222_unit(:) ) ! [IN]
89 
90  case default
91  log_error("ATMOS_PHY_CH_driver_tracer_setup",*) 'invalid chemistry type(', atmos_phy_ch_type, '). CHECK!'
92  call prc_abort
93  end select
94 
95  qe_ch = qs_ch + qa_ch - 1
96 
97  else
98  qa_ch = 0
99  qs_ch = -1
100  qe_ch = -2
101  endif
102 
103  return
104  end subroutine atmos_phy_ch_driver_tracer_setup
105 
106  !-----------------------------------------------------------------------------
108  subroutine atmos_phy_ch_driver_setup
110  real_lon => atmos_grid_cartesc_real_lon, &
111  real_lat => atmos_grid_cartesc_real_lat
112  use scale_atmos_phy_ch_rn222, only: &
114  use scale_atmos_sfc_ch_rn222, only: &
116  use mod_atmos_admin, only: &
119  implicit none
120  !---------------------------------------------------------------------------
121 
122  log_newline
123  log_info("ATMOS_PHY_CH_driver_setup",*) 'Setup'
124 
125  if ( atmos_sw_phy_ch ) then
126 
127  select case ( atmos_phy_ch_type )
128  case ( 'RN222' )
130  call atmos_sfc_ch_rn222_setup( ia, ja, & ! [IN]
131  real_lon, real_lat ) ! [IN]
132  end select
133 
134  else
135  log_info("ATMOS_PHY_CH_driver_setup",*) 'this component is never called.'
136  endif
137 
138  return
139  end subroutine atmos_phy_ch_driver_setup
140 
141  !-----------------------------------------------------------------------------
146  use mod_atmos_admin, only: &
149  implicit none
150  !---------------------------------------------------------------------------
151 
152  log_newline
153  log_info("ATMOS_PHY_CH_driver_finalize",*) 'Finalize'
154 
155  if ( atmos_sw_phy_ch ) then
156 
157  select case ( atmos_phy_ch_type )
158  case ( 'RN222' )
160  end select
161 
162  end if
163 
164  return
165  end subroutine atmos_phy_ch_driver_finalize
166 
167  !-----------------------------------------------------------------------------
169  subroutine atmos_phy_ch_driver_calc_tendency( update_flag )
170  use scale_tracer, only: &
172  use scale_time, only: &
173  dt_ch => time_dtsec_atmos_phy_ch
174  use scale_statistics, only: &
176  statistics_total
177  use scale_atmos_grid_cartesc_real, only: &
180  use scale_file_history, only: &
181  file_history_in
182  use mod_atmos_vars, only: &
183  dens => dens_av, &
184  qtrc => qtrc_av, &
185  rhoq_t => rhoq_tp
186  use mod_atmos_phy_sf_vars, only: &
187  sflx_qtrc => atmos_phy_sf_sflx_qtrc
188  use mod_atmos_phy_ch_vars, only: &
189  rhoq_t_ch => atmos_phy_ch_rhoq_t, &
190  qa_ch, &
191  qs_ch, &
192  qe_ch
193 ! O3 => ATMOS_PHY_CH_O3
194  use mod_atmos_admin, only: &
196  use scale_atmos_phy_ch_rn222, only: &
198  implicit none
199 
200  logical, intent(in) :: update_flag
201 
202  integer :: k, i, j, iq
203  !---------------------------------------------------------------------------
204 
205  if ( update_flag ) then
206 
207 !OCL XFILL
208  !$acc kernels
209  rhoq_t_ch(:,:,:,:) = 0.0_rp
210  !$acc end kernels
211 
212  select case( atmos_phy_ch_type )
213  case( 'RN222' )
214  !$acc update host(DENS,QTRC(:,:,:,QS_CH:QE_CH),RHOQ_t_CH(:,:,:,QS_CH:QE_CH))
215  call atmos_phy_ch_rn222_tendency( ka, ks, ke, & ! [IN]
216  ia, is, ie, & ! [IN]
217  ja, js, je, & ! [IN]
218  qa_ch, & ! [IN]
219  dens(:,:,:), & ! [IN]
220  qtrc(:,:,:,qs_ch:qe_ch), & ! [IN]
221  rhoq_t_ch(:,:,:,qs_ch:qe_ch) ) ! [INOUT]
222  !$acc update device(RHOQ_t_CH(:,:,:,QS_CH:QE_CH))
223  end select
224 
225  do iq = qs_ch, qe_ch
226  call file_history_in( rhoq_t_ch(:,:,:,iq), trim(tracer_name(iq))//'_t_CH', &
227  'tendency rho*'//trim(tracer_name(iq))//' in CH', &
228  'kg/m3/s', fill_halo=.true. )
229  enddo
230  endif
231 
232  !$omp parallel do private(i,j,k) collapse(3) OMP_SCHEDULE_
233  !$acc kernels
234  do iq = qs_ch, qe_ch
235  do j = js, je
236  do i = is, ie
237  do k = ks, ke
238  rhoq_t(k,i,j,iq) = rhoq_t(k,i,j,iq) + rhoq_t_ch(k,i,j,iq)
239  enddo
240  enddo
241  enddo
242  enddo
243  !$acc end kernels
244 
245  if ( statistics_checktotal ) then
246  do iq = qs_ch, qe_ch
247  call statistics_total( ka, ks, ke, ia, is, ie, ja, js, je, &
248  rhoq_t_ch(:,:,:,iq), trim(tracer_name(iq))//'_t_CH', &
251  enddo
252  endif
253 
254  return
255  end subroutine atmos_phy_ch_driver_calc_tendency
256 
257  !-----------------------------------------------------------------------------
259  subroutine atmos_phy_ch_driver_ocean_flux( &
260  SFLX_QTRC )
262  use scale_atmos_sfc_ch_rn222, only: &
264  use mod_atmos_admin, only: &
266  use mod_atmos_phy_ch_vars, only: &
267  qa_ch, &
268  qs_ch, &
269  qe_ch
270  implicit none
271 
272  real(rp), intent(inout) :: sflx_qtrc(oia,oja,qa)
273 
274  !---------------------------------------------------------------------------
275 
276  select case( atmos_phy_ch_type )
277  case( 'RN222' )
278  !$acc update host(SFLX_QTRC(:,:,QS_CH:QE_CH))
279  call atmos_sfc_ch_rn222_ocean_flux( oia, ois, oie, & ! [IN]
280  oja, ojs, oje, & ! [IN]
281  qa_ch, & ! [IN]
282  sflx_qtrc(:,:,qs_ch:qe_ch) ) ! [INOUT]
283  !$acc update device(SFLX_QTRC(:,:,QS_CH:QE_CH))
284  end select
285 
286  return
287  end subroutine atmos_phy_ch_driver_ocean_flux
288 
289  !-----------------------------------------------------------------------------
291  subroutine atmos_phy_ch_driver_land_flux( &
292  SFLX_QTRC )
294  use scale_time, only: &
296  use scale_atmos_sfc_ch_rn222, only: &
298  use mod_atmos_admin, only: &
300  use mod_atmos_phy_ch_vars, only: &
301  qa_ch, &
302  qs_ch, &
303  qe_ch
304  implicit none
305 
306  real(rp), intent(inout) :: sflx_qtrc(lia,lja,qa)
307 
308  !---------------------------------------------------------------------------
309 
310  select case( atmos_phy_ch_type )
311  case( 'RN222' )
312  !$acc update host(SFLX_QTRC(:,:,QS_CH:QE_CH))
313  call atmos_sfc_ch_rn222_land_flux( lia, lis, lie, & ! [IN]
314  lja, ljs, lje, & ! [IN]
315  qa_ch, & ! [IN]
316  time_nowdate(:), & ! [IN]
317  sflx_qtrc(:,:,qs_ch:qe_ch) ) ! [INOUT]
318  !$acc update device(SFLX_QTRC(:,:,QS_CH:QE_CH))
319  end select
320 
321  return
322  end subroutine atmos_phy_ch_driver_land_flux
323 
324  !-----------------------------------------------------------------------------
326  subroutine atmos_phy_ch_driver_urban_flux( &
327  SFLX_QTRC )
329  use scale_time, only: &
331  use scale_atmos_sfc_ch_rn222, only: &
333  use mod_atmos_admin, only: &
335  use mod_atmos_phy_ch_vars, only: &
336  qa_ch, &
337  qs_ch, &
338  qe_ch
339  implicit none
340 
341  real(rp), intent(inout) :: sflx_qtrc(uia,uja,qa)
342 
343  !---------------------------------------------------------------------------
344 
345  select case( atmos_phy_ch_type )
346  case( 'RN222' )
347  !$acc update host(SFLX_QTRC(:,:,QS_CH:QE_CH))
348  call atmos_sfc_ch_rn222_land_flux( uia, uis, uie, & ! [IN]
349  uja, ujs, uje, & ! [IN]
350  qa_ch, & ! [IN]
351  time_nowdate(:), & ! [IN]
352  sflx_qtrc(:,:,qs_ch:qe_ch) ) ! [INOUT]
353  !$acc update device(SFLX_QTRC(:,:,QS_CH:QE_CH))
354  end select
355 
356  return
357  end subroutine atmos_phy_ch_driver_urban_flux
358 
359 end module mod_atmos_phy_ch_driver
scale_atmos_sfc_ch_rn222
module atmosphere / surface / chemistry / RN222
Definition: scale_atmos_sfc_ch_rn222.F90:12
scale_statistics
module Statistics
Definition: scale_statistics.F90:11
scale_atmos_sfc_ch_rn222::atmos_sfc_ch_rn222_setup
subroutine, public atmos_sfc_ch_rn222_setup(IA, JA, real_lon, real_lat)
Setup.
Definition: scale_atmos_sfc_ch_rn222.F90:82
scale_urban_grid_cartesc_index::uja
integer, public uja
Definition: scale_urban_grid_cartesC_index.F90:45
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_prc::prc_abort
subroutine, public prc_abort
Abort Process.
Definition: scale_prc.F90:350
scale_land_grid_cartesc_index::ljs
integer, public ljs
Definition: scale_land_grid_cartesC_index.F90:46
scale_tracer::qa
integer, public qa
Definition: scale_tracer.F90:35
scale_land_grid_cartesc_index::lia
integer, public lia
Definition: scale_land_grid_cartesC_index.F90:41
scale_urban_grid_cartesc_index::uia
integer, public uia
Definition: scale_urban_grid_cartesC_index.F90:41
mod_atmos_vars::rhoq_tp
real(rp), dimension(:,:,:,:), allocatable, public rhoq_tp
Definition: mod_atmos_vars.F90:121
scale_land_grid_cartesc_index::lja
integer, public lja
Definition: scale_land_grid_cartesC_index.F90:45
mod_atmos_vars::qtrc_av
real(rp), dimension(:,:,:,:), pointer, public qtrc_av
Definition: mod_atmos_vars.F90:95
mod_atmos_phy_ch_driver::atmos_phy_ch_driver_tracer_setup
subroutine, public atmos_phy_ch_driver_tracer_setup
Config.
Definition: mod_atmos_phy_ch_driver.F90:54
scale_ocean_grid_cartesc_index::oie
integer, public oie
Definition: scale_ocean_grid_cartesC_index.F90:44
scale_precision
module PRECISION
Definition: scale_precision.F90:14
scale_atmos_grid_cartesc_index::ka
integer, public ka
Definition: scale_atmos_grid_cartesC_index.F90:47
mod_atmos_admin
module ATMOS admin
Definition: mod_atmos_admin.F90:11
scale_land_grid_cartesc_index::lje
integer, public lje
Definition: scale_land_grid_cartesC_index.F90:47
scale_atmos_sfc_ch_rn222::atmos_sfc_ch_rn222_land_flux
subroutine, public atmos_sfc_ch_rn222_land_flux(IA, IS, IE, JA, JS, JE, QA_CH, NOWDATE, SFLX_QTRC)
Emission from the land surface.
Definition: scale_atmos_sfc_ch_rn222.F90:321
scale_time::time_dtsec_atmos_phy_ch
real(dp), public time_dtsec_atmos_phy_ch
time interval of physics(chemistry ) [sec]
Definition: scale_time.F90:43
mod_atmos_phy_ch_driver::atmos_phy_ch_driver_setup
subroutine, public atmos_phy_ch_driver_setup
Setup.
Definition: mod_atmos_phy_ch_driver.F90:109
mod_atmos_phy_sf_vars
module ATMOSPHERIC Surface Variables
Definition: mod_atmos_phy_sf_vars.F90:12
mod_atmos_phy_ch_driver::atmos_phy_ch_driver_ocean_flux
subroutine, public atmos_phy_ch_driver_ocean_flux(SFLX_QTRC)
Driver.
Definition: mod_atmos_phy_ch_driver.F90:261
mod_atmos_phy_ch_vars::qa_ch
integer, public qa_ch
Definition: mod_atmos_phy_ch_vars.F90:61
scale_urban_grid_cartesc_index
module urban / grid / icosahedralA / index
Definition: scale_urban_grid_cartesC_index.F90:11
mod_atmos_phy_ch_vars::qs_ch
integer, public qs_ch
Definition: mod_atmos_phy_ch_vars.F90:62
scale_atmos_grid_cartesc_real
module Atmosphere GRID CartesC Real(real space)
Definition: scale_atmos_grid_cartesC_real.F90:11
mod_atmos_vars::qtrc
real(rp), dimension(:,:,:,:), allocatable, target, public qtrc
Definition: mod_atmos_vars.F90:81
scale_file_history
module file_history
Definition: scale_file_history.F90:15
scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_lon
real(rp), dimension(:,:), allocatable, public atmos_grid_cartesc_real_lon
longitude [rad,0-2pi]
Definition: scale_atmos_grid_cartesC_real.F90:49
scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_unit
character(len=h_short), dimension(qa_ch), public atmos_phy_ch_rn222_unit
Definition: scale_atmos_phy_ch_rn222.F90:40
scale_ocean_grid_cartesc_index::ois
integer, public ois
Definition: scale_ocean_grid_cartesC_index.F90:43
scale_land_grid_cartesc_index
module land / grid / cartesianC / index
Definition: scale_land_grid_cartesC_index.F90:11
scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_desc
character(len=h_mid), dimension(qa_ch), public atmos_phy_ch_rn222_desc
Definition: scale_atmos_phy_ch_rn222.F90:39
scale_prc
module PROCESS
Definition: scale_prc.F90:11
scale_precision::rp
integer, parameter, public rp
Definition: scale_precision.F90:41
scale_ocean_grid_cartesc_index::oje
integer, public oje
Definition: scale_ocean_grid_cartesC_index.F90:49
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_io
module STDIO
Definition: scale_io.F90:10
scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_name
character(len=h_short), dimension(qa_ch), public atmos_phy_ch_rn222_name
Definition: scale_atmos_phy_ch_rn222.F90:38
mod_atmos_vars::dens
real(rp), dimension(:,:,:), allocatable, target, public dens
Definition: mod_atmos_vars.F90:76
scale_ocean_grid_cartesc_index::oja
integer, public oja
Definition: scale_ocean_grid_cartesC_index.F90:47
scale_atmos_grid_cartesc_index
module atmosphere / grid / cartesC index
Definition: scale_atmos_grid_cartesC_index.F90:12
scale_atmos_grid_cartesc_index::ia
integer, public ia
Definition: scale_atmos_grid_cartesC_index.F90:48
scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_vol
real(rp), dimension(:,:,:), allocatable, public atmos_grid_cartesc_real_vol
control volume (zxy) [m3]
Definition: scale_atmos_grid_cartesC_real.F90:84
scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_tendency
subroutine, public atmos_phy_ch_rn222_tendency(KA, KS, KE, IA, IS, IE, JA, JS, JE, QA_CH, DENS, QTRC, RHOQ_t)
Chemistry Microphysics.
Definition: scale_atmos_phy_ch_rn222.F90:106
mod_atmos_admin::atmos_phy_ch_type
character(len=h_short), public atmos_phy_ch_type
Definition: mod_atmos_admin.F90:38
scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_ntracers
integer, public atmos_phy_ch_rn222_ntracers
Definition: scale_atmos_phy_ch_rn222.F90:36
scale_land_grid_cartesc_index::lie
integer, public lie
Definition: scale_land_grid_cartesC_index.F90:43
mod_atmos_phy_ch_driver::atmos_phy_ch_driver_finalize
subroutine, public atmos_phy_ch_driver_finalize
finalize
Definition: mod_atmos_phy_ch_driver.F90:144
mod_atmos_phy_ch_vars::atmos_phy_ch_rhoq_t
real(rp), dimension(:,:,:,:), allocatable, public atmos_phy_ch_rhoq_t
Definition: mod_atmos_phy_ch_vars.F90:57
scale_tracer::tracer_name
character(len=h_short), dimension(qa_max), public tracer_name
Definition: scale_tracer.F90:39
scale_prof
module profiler
Definition: scale_prof.F90:11
mod_atmos_phy_ch_vars
module Atmosphere / Physics Chemistry
Definition: mod_atmos_phy_ch_vars.F90:12
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_ocean_grid_cartesc_index
module ocean / grid / cartesianC / index
Definition: scale_ocean_grid_cartesC_index.F90:11
mod_atmos_phy_ch_driver::atmos_phy_ch_driver_urban_flux
subroutine, public atmos_phy_ch_driver_urban_flux(SFLX_QTRC)
Driver.
Definition: mod_atmos_phy_ch_driver.F90:328
mod_atmos_admin::atmos_sw_phy_ch
logical, public atmos_sw_phy_ch
Definition: mod_atmos_admin.F90:54
scale_atmos_phy_ch_rn222::atmos_phy_ch_rn222_setup
subroutine, public atmos_phy_ch_rn222_setup
Setup.
Definition: scale_atmos_phy_ch_rn222.F90:59
scale_atmos_grid_cartesc_index::ja
integer, public ja
Definition: scale_atmos_grid_cartesC_index.F90:49
scale_time
module TIME
Definition: scale_time.F90:11
scale_land_grid_cartesc_index::lis
integer, public lis
Definition: scale_land_grid_cartesC_index.F90:42
mod_atmos_phy_sf_vars::atmos_phy_sf_sflx_qtrc
real(rp), dimension(:,:,:), allocatable, target, public atmos_phy_sf_sflx_qtrc
Definition: mod_atmos_phy_sf_vars.F90:86
scale_tracer::tracer_regist
subroutine, public tracer_regist(QS, NQ, NAME, DESC, UNIT, CV, CP, R, ENGI0, ADVC, MASS)
Regist tracer.
Definition: scale_tracer.F90:68
scale_tracer
module TRACER
Definition: scale_tracer.F90:12
mod_atmos_vars::dens_av
real(rp), dimension(:,:,:), pointer, public dens_av
Definition: mod_atmos_vars.F90:90
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_phy_ch_rn222
module atmosphere / physics / chemistry / RN222
Definition: scale_atmos_phy_ch_rn222.F90:12
mod_atmos_phy_ch_driver
module ATMOSPHERE / Physics Chemistry
Definition: mod_atmos_phy_ch_driver.F90:12
scale_statistics::statistics_checktotal
logical, public statistics_checktotal
calc&report variable totals to logfile?
Definition: scale_statistics.F90:109
mod_atmos_vars
module ATMOSPHERIC Variables
Definition: mod_atmos_vars.F90:12
scale_time::time_nowdate
integer, dimension(6), public time_nowdate
current time [YYYY MM DD HH MM SS]
Definition: scale_time.F90:68
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_ocean_grid_cartesc_index::ojs
integer, public ojs
Definition: scale_ocean_grid_cartesC_index.F90:48
scale_atmos_sfc_ch_rn222::atmos_sfc_ch_rn222_finalize
subroutine, public atmos_sfc_ch_rn222_finalize
finalize
Definition: scale_atmos_sfc_ch_rn222.F90:270
scale_urban_grid_cartesc_index::uis
integer, public uis
Definition: scale_urban_grid_cartesC_index.F90:42
scale_ocean_grid_cartesc_index::oia
integer, public oia
Definition: scale_ocean_grid_cartesC_index.F90:42
mod_atmos_phy_ch_driver::atmos_phy_ch_driver_land_flux
subroutine, public atmos_phy_ch_driver_land_flux(SFLX_QTRC)
Driver.
Definition: mod_atmos_phy_ch_driver.F90:293
mod_atmos_phy_ch_vars::qe_ch
integer, public qe_ch
Definition: mod_atmos_phy_ch_vars.F90:63
scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_lat
real(rp), dimension(:,:), allocatable, public atmos_grid_cartesc_real_lat
latitude [rad,-pi,pi]
Definition: scale_atmos_grid_cartesC_real.F90:53
scale_atmos_sfc_ch_rn222::atmos_sfc_ch_rn222_ocean_flux
subroutine, public atmos_sfc_ch_rn222_ocean_flux(IA, IS, IE, JA, JS, JE, QA_CH, SFLX_QTRC)
Emission from the ocean surface.
Definition: scale_atmos_sfc_ch_rn222.F90:289
scale_atmos_grid_cartesc_real::atmos_grid_cartesc_real_totvol
real(rp), public atmos_grid_cartesc_real_totvol
total volume (zxy, local) [m3]
Definition: scale_atmos_grid_cartesC_real.F90:88
scale_urban_grid_cartesc_index::uje
integer, public uje
Definition: scale_urban_grid_cartesC_index.F90:47
mod_atmos_phy_ch_driver::atmos_phy_ch_driver_calc_tendency
subroutine, public atmos_phy_ch_driver_calc_tendency(update_flag)
Driver.
Definition: mod_atmos_phy_ch_driver.F90:170
scale_urban_grid_cartesc_index::ujs
integer, public ujs
Definition: scale_urban_grid_cartesC_index.F90:46
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_urban_grid_cartesc_index::uie
integer, public uie
Definition: scale_urban_grid_cartesC_index.F90:43