FE-Project
Loading...
Searching...
No Matches
mod_atmos_component.F90
Go to the documentation of this file.
1!-------------------------------------------------------------------------------
10!-------------------------------------------------------------------------------
11#include "scaleFElib.h"
13 !-----------------------------------------------------------------------------
14 !
15 !++ used modules
16 !
17 use scale_precision
18 use scale_io
19 use scale_prof
20 use scale_prc
21
22 use scale_mesh_base, only: meshbase
27 use scale_localmeshfield_base, only: &
31
32 use mod_atmos_mesh, only: atmosmesh
35
36 use mod_atmos_vars, only: atmosvars
37
38 use mod_atmos_dyn, only: atmosdyn
42
43 !-----------------------------------------------------------------------------
44 implicit none
45 private
46 !-----------------------------------------------------------------------------
47 !
48 !++ Public type & procedure
49 !
50 type, extends(modelcomponent), public :: atmoscomponent
51 type(atmosvars) :: vars
52
53 character(len=H_SHORT) :: mesh_type
54 class(atmosmesh), pointer :: mesh
55 type(atmosmeshrm) :: mesh_rm
56 type(atmosmeshgm) :: mesh_gm
57
58 type(atmosdyn) :: dyn_proc
59 type(atmosphysfc) :: phy_sfc_proc
60 type(atmosphytb ) :: phy_tb_proc
61 type(atmosphymp ) :: phy_mp_proc
62
63 contains
64 procedure, public :: setup => atmos_setup
65 procedure, public :: setup_vars => atmos_setup_vars
66 procedure, public :: calc_tendency => atmos_calc_tendency
67 procedure, public :: update => atmos_update
68 procedure, public :: set_surface => atmos_set_surface
69 procedure, public :: finalize => atmos_finalize
70 end type atmoscomponent
71
72 !-----------------------------------------------------------------------------
73 !
74 !++ Public parameters & variables
75 !
76 !-----------------------------------------------------------------------------
77 !
78 !++ Private procedure
79 !
80 !-----------------------------------------------------------------------------
81 !
82 !++ Private parameters & variables
83 !
84 !-----------------------------------------------------------------------------
85contains
86
87!OCL SERIAL
88 subroutine atmos_setup( this )
89 use scale_const, only: &
90 undef8 => const_undef8
91
92 use scale_atmos_hydrometeor, only: &
93 atmos_hydrometeor_dry, &
94 atmos_hydrometeor_regist
95 use scale_atmos_thermodyn, only: &
96 atmos_thermodyn_setup
97 use scale_atmos_saturation, only: &
98 atmos_saturation_setup
99
102 use scale_time_manager, only: &
104
105 implicit none
106
107 class(atmoscomponent), intent(inout), target :: this
108
109 logical :: ACTIVATE_FLAG = .true.
110
111 real(DP) :: TIME_DT = undef8
112 character(len=H_SHORT) :: TIME_DT_UNIT = 'SEC'
113 real(DP) :: TIME_DT_RESTART = undef8
114 character(len=H_SHORT) :: TIME_DT_RESTART_UNIT = 'SEC'
115
116 logical :: ATMOS_DYN_DO = .true.
117 logical :: ATMOS_PHY_SF_DO = .false.
118 logical :: ATMOS_PHY_TB_DO = .false.
119 logical :: ATMOS_PHY_MP_DO = .false.
120 character(len=H_SHORT) :: ATMOS_MESH_TYPE = 'REGIONAL' ! 'REGIONAL' or 'GLOBAL'
121
122 logical :: ATMOS_USE_QV = .false.
123
124 namelist / param_atmos / &
125 activate_flag, &
126 time_dt, &
127 time_dt_unit, &
128 time_dt_restart, &
129 time_dt_restart_unit, &
130 atmos_mesh_type, &
131 atmos_dyn_do, &
132 atmos_phy_sf_do, &
133 atmos_phy_tb_do, &
134 atmos_phy_mp_do, &
135 atmos_use_qv
136
137 integer :: ierr
138 !--------------------------------------------------
139 call prof_rapstart( 'ATM_setup', 1)
140 log_info('AtmosComponent_setup',*) 'Atmosphere model components '
141
142 !--- read namelist
143 rewind(io_fid_conf)
144 read(io_fid_conf,nml=param_atmos,iostat=ierr)
145 if( ierr < 0 ) then !--- missing
146 log_info("ATMOS_setup",*) 'Not found namelist. Default used.'
147 elseif( ierr > 0 ) then !--- fatal error
148 log_error("ATM_setup",*) 'Not appropriate names in namelist PARAM_ATMOS. Check!'
149 call prc_abort
150 endif
151 log_nml(param_atmos)
152
153 !************************************************
154 call this%ModelComponent_Init('ATMOS', activate_flag )
155 if ( .not. activate_flag ) return
156
157 !- Setup time manager
158
159 call this%time_manager%Init( this%GetComponentName(), &
160 time_dt, time_dt_unit, &
161 time_dt_restart, time_dt_restart_unit )
162
163 call time_manager_regist_component( this%time_manager )
164
165 !- Setup mesh & file I/O for atmospheric component
166
167 this%mesh_type = atmos_mesh_type
168 select case( this%mesh_type )
169 case('REGIONAL')
170 call this%mesh_rm%Init()
171 call file_history_meshfield_setup( mesh3d_=this%mesh_rm%mesh )
172 this%mesh => this%mesh_rm
173 case('GLOBAL')
174 call this%mesh_gm%Init()
175 call file_history_meshfield_setup( meshcubedsphere3d_=this%mesh_gm%mesh )
176 this%mesh => this%mesh_gm
177 case default
178 log_error("ATM_setup",*) 'Unsupported type of mesh is specified. Check!', this%mesh_type
179 call prc_abort
180 end select
181
182 !- setup common tools for atmospheric model
183
184 call atmos_thermodyn_setup
185 call atmos_saturation_setup
186
187 !- Setup each processes in atmospheric model ------------------------------------
188
189 !- Setup the module for atmosphere / physics / surface
190 call this%phy_sfc_proc%ModelComponentProc_Init( 'AtmosPhysSfc', atmos_phy_sf_do )
191 call this%phy_sfc_proc%setup( this%mesh, this%time_manager )
192
193 !- Setup the module for atmosphere / physics / cloud microphysics
194 call this%phy_mp_proc%ModelComponentProc_Init( 'AtmosPhysMp', atmos_phy_mp_do )
195 call this%phy_mp_proc%setup( this%mesh, this%time_manager )
196
197 !-- Regist qv if needed
198 if ( atmos_hydrometeor_dry .and. atmos_use_qv ) then
199 log_info("ATMOS_setup",*) "Regist QV"
200 call atmos_hydrometeor_regist( 0, 0, & ! (in)
201 (/'QV'/), & ! (in)
202 (/'Ratio of Water Vapor mass to total mass (Specific humidity)'/), & ! (in)
203 (/'kg/kg'/), & ! (in)
204 this%phy_mp_proc%vars%QS ) ! (out)
205
206 this%phy_mp_proc%vars%QA = 1
207 this%phy_mp_proc%vars%QE = this%phy_mp_proc%vars%QS
208 end if
209
210 !- Setup the module for atmosphere / dynamics
211 call this%dyn_proc%ModelComponentProc_Init( 'AtmosDyn', atmos_dyn_do )
212 call this%dyn_proc%setup( this%mesh, this%time_manager )
213
214 !- Setup the module for atmosphere / physics / turbulence
215 call this%phy_tb_proc%ModelComponentProc_Init( 'AtmosPhysTb', atmos_phy_tb_do )
216 call this%phy_tb_proc%setup( this%mesh, this%time_manager )
217 call this%phy_tb_proc%SetDynBC( this%dyn_proc%dyncore_driver%boundary_cond )
218
219 log_newline
220 log_info('AtmosComponent_setup',*) 'Finish setup of each atmospheric components.'
221
222 call prof_rapend( 'ATM_setup', 1)
223
224 return
225 end subroutine atmos_setup
226
227!OCL SERIAL
228 subroutine atmos_setup_vars( this )
229 implicit none
230
231 class(atmoscomponent), intent(inout) :: this
232 !----------------------------------------------------------
233
234 call prof_rapstart( 'ATM_setup_vars', 1)
235
236 call this%vars%Init( this%mesh )
237 call this%vars%Regist_physvar_manager( &
238 this%phy_mp_proc%vars%auxvars2D_manager )
239
240 call prof_rapend( 'ATM_setup_vars', 1)
241
242 return
243 end subroutine atmos_setup_vars
244
245!OCL SERIAL
246 subroutine atmos_calc_tendency( this, force )
247 use scale_tracer, only: qa
249 phytend_num1 => phytend_num, &
250 dens_tp => phytend_dens_id, &
251 momx_tp => phytend_momx_id, &
252 momy_tp => phytend_momy_id, &
253 momz_tp => phytend_momz_id, &
254 rhot_tp => phytend_rhot_id, &
255 rhoh_p => phytend_rhoh_id
256 use mod_atmos_vars, only: &
258
259 implicit none
260 class(atmoscomponent), intent(inout) :: this
261 logical, intent(in) :: force
262
263
264 class(meshbase), pointer :: mesh
265 class(localmesh3d), pointer :: lcmesh
266 type(localmeshfieldbaselist) :: tp_list(PHYTEND_NUM1)
267 type(localmeshfieldbaselist) :: tp_qtrc(QA)
268
269 integer :: tm_process_id
270 logical :: is_update
271 integer :: n
272 integer :: v
273 integer :: iq
274 integer :: ke
275 !------------------------------------------------------------------
276
277 call prof_rapstart( 'ATM_tendency', 1)
278 !LOG_INFO('AtmosComponent_calc_tendency',*)
279
280 call this%mesh%GetModelMesh( mesh )
281
282 !########## Get Surface Boundary from coupler ##########
283
284
285 !########## calculate tendency ##########
286
287 !* Exchange halo data ( for physics )
288 call prof_rapstart( 'ATM_exchange_prgv', 2)
289 call this%vars%PROGVARS_manager%MeshFieldComm_Exchange()
290 if ( qa > 0 ) call this%vars%QTRCVARS_manager%MeshFieldComm_Exchange()
291 call prof_rapend( 'ATM_exchange_prgv', 2)
292
293 ! reset tendencies of physics
294
295 do n=1, mesh%LOCAL_MESH_NUM
296 call atmosvars_getlocalmeshphytends( n, mesh, this%vars%PHYTENDS_manager , & ! (in)
297 tp_list(dens_tp)%ptr, tp_list(momx_tp)%ptr, tp_list(momy_tp)%ptr, & ! (out)
298 tp_list(momz_tp)%ptr, tp_list(rhot_tp)%ptr, tp_list(rhoh_p )%ptr, tp_qtrc, & ! (out)
299 lcmesh ) ! (out)
300
301 !$omp parallel private(v,iq,ke)
302 !$omp do collapse(2)
303 do v=1, phytend_num1
304 do ke=lcmesh%NeS, lcmesh%NeE
305 tp_list(v)%ptr%val(:,ke) = 0.0_rp
306 end do
307 end do
308 !$omp do collapse(2)
309 do iq=1, qa
310 do ke=lcmesh%NeS, lcmesh%NeE
311 tp_qtrc(iq)%ptr%val(:,ke) = 0.0_rp
312 end do
313 end do
314 !$omp end do
315 !$omp end parallel
316 end do
317
318 ! Cloud Microphysics
319
320 if ( this%phy_mp_proc%IsActivated() ) then
321 call prof_rapstart('ATM_Microphysics', 1)
322 tm_process_id = this%phy_mp_proc%tm_process_id
323 is_update = this%time_manager%Do_process(tm_process_id) .or. force
324 call this%phy_mp_proc%calc_tendency( &
325 this%mesh, this%vars%PROGVARS_manager, this%vars%QTRCVARS_manager, &
326 this%vars%AUXVARS_manager, this%vars%PHYTENDS_manager, is_update )
327 call prof_rapend('ATM_Microphysics', 1)
328 end if
329
330 ! Radiation
331
332
333 ! Turbulence
334
335 if ( this%phy_tb_proc%IsActivated() ) then
336 call prof_rapstart('ATM_Turbulence', 1)
337 tm_process_id = this%phy_tb_proc%tm_process_id
338 is_update = this%time_manager%Do_process(tm_process_id) .or. force
339 call this%phy_tb_proc%calc_tendency( &
340 this%mesh, this%vars%PROGVARS_manager, this%vars%QTRCVARS_manager, &
341 this%vars%AUXVARS_manager, this%vars%PHYTENDS_manager, is_update )
342 call prof_rapend('ATM_Turbulence', 1)
343 end if
344
345 ! Cumulus
346
347
348! if ( .not. CPL_sw ) then
349
350 ! Surface flux
351
352 if ( this%phy_sfc_proc%IsActivated() ) then
353 call prof_rapstart('ATM_SurfaceFlux', 1)
354 tm_process_id = this%phy_sfc_proc%tm_process_id
355 is_update = this%time_manager%Do_process(tm_process_id) .or. force
356 call this%phy_sfc_proc%calc_tendency( &
357 this%mesh, this%vars%PROGVARS_manager, this%vars%QTRCVARS_manager, &
358 this%vars%AUXVARS_manager, this%vars%PHYTENDS_manager, is_update )
359 call prof_rapend('ATM_SurfaceFlux', 1)
360 end if
361
362 ! Planetary Boundary layer
363
364! end if
365
366 call prof_rapend( 'ATM_tendency', 1)
367 return
368 end subroutine atmos_calc_tendency
369
370!OCL SERIAL
371 subroutine atmos_update( this )
372 implicit none
373 class(atmoscomponent), intent(inout) :: this
374
375 integer :: tm_process_id
376 logical :: is_update
377 integer :: inner_itr
378 !--------------------------------------------------
379 call prof_rapstart( 'ATM_update', 1)
380
381 !########## Dynamics ##########
382
383 if ( this%dyn_proc%IsActivated() ) then
384 call prof_rapstart('ATM_Dynamics', 1)
385 tm_process_id = this%dyn_proc%tm_process_id
386 is_update = this%time_manager%Do_process( tm_process_id )
387
388 log_progress(*) 'atmosphere / dynamics'
389 do inner_itr=1, this%time_manager%Get_process_inner_itr_num( tm_process_id )
390 call this%dyn_proc%update( &
391 this%mesh, this%vars%PROGVARS_manager, this%vars%QTRCVARS_manager, &
392 this%vars%AUXVARS_manager, this%vars%PHYTENDS_manager, is_update )
393 end do
394 call prof_rapend('ATM_Dynamics', 1)
395 end if
396
397 !########## Calculate diagnostic variables ##########
398
399 call this%vars%Calc_diagnostics()
400 call this%vars%AUXVARS_manager%MeshFieldComm_Exchange()
401
402 !########## Adjustment ##########
403 ! Microphysics
404 ! Aerosol
405 ! Lightning
406
407 !########## Reference State ###########
408
409 !#### Check values #################################
410 call this%vars%Check()
411
412 call prof_rapend('ATM_update', 1)
413 return
414 end subroutine atmos_update
415
416!OCL SERIAL
417 subroutine atmos_set_surface( this )
418 use mod_atmos_vars, only: &
420 use mod_atmos_phy_mp_vars, only: &
422 implicit none
423 class(atmoscomponent), intent(inout) :: this
424
425 class(meshbase), pointer :: mesh
426 class(meshbase2d), pointer :: mesh2D
427 class(localmesh2d), pointer :: lcmesh
428 integer :: n
429 integer :: ke
430
431 class(localmeshfieldbase), pointer :: PREC, PREC_ENGI
432 class(localmeshfieldbase), pointer :: SFLX_rain_MP, SFLX_snow_MP, SFLX_ENGI_MP
433
434 !--------------------------------------------------
435
436 call prof_rapstart( 'ATM_sfc_exch', 1)
437
438 call this%mesh%GetModelMesh( mesh )
439 select type(mesh)
440 class is (meshbase3d)
441 call mesh%GetMesh2D( mesh2d )
442 end select
443
444 !- sum of rainfall from mp and cp
445
446 do n=1, mesh2d%LOCAL_MESH_NUM
448 mesh2d, this%vars%AUXVARS2D_manager, & ! (in)
449 prec, prec_engi, lcmesh ) ! (out)
450
451 !$omp parallel do private(ke)
452 do ke=lcmesh%NeS, lcmesh%NeE
453 prec %val(:,ke) = 0.0_rp
454 prec_engi%val(:,ke) = 0.0_rp
455 end do
456
457 if ( this%phy_mp_proc%IsActivated() ) then
459 mesh2d, this%phy_mp_proc%vars%auxvars2D_manager, & ! (in)
460 sflx_rain_mp, sflx_snow_mp, sflx_engi_mp ) ! (out)
461
462 !$omp parallel do private(ke)
463 do ke=lcmesh%NeS, lcmesh%NeE
464 prec %val(:,ke) = prec %val(:,ke) + sflx_rain_mp%val(:,ke) + sflx_snow_mp%val(:,ke)
465 prec_engi%val(:,ke) = prec_engi%val(:,ke) + sflx_engi_mp%val(:,ke)
466 end do
467 end if
468 end do
469
470 call prof_rapend( 'ATM_sfc_exch', 1)
471
472 return
473 end subroutine atmos_set_surface
474
475!OCL SERIAL
476 subroutine atmos_finalize( this )
477 implicit none
478 class(atmoscomponent), intent(inout) :: this
479 !--------------------------------------------------
480
481 log_info('AtmosComponent_finalize',*)
482
483 if ( .not. this%IsActivated() ) return
484
485 call this%dyn_proc%finalize()
486 call this%phy_sfc_proc%finalize()
487 call this%phy_tb_proc%finalize()
488 call this%phy_mp_proc%finalize()
489
490 call this%vars%Final()
491
492 select case( this%mesh_type )
493 case('REGIONAL')
494 call this%mesh_rm%Final()
495 case('GLOBAL')
496 call this%mesh_gm%Final()
497 end select
498 this%mesh => null()
499
500 call this%time_manager%Final()
501
502 return
503 end subroutine atmos_finalize
504
505end module mod_atmos_component
module ATMOSPHERE component
subroutine atmos_setup(this)
module ATMOSPHERE dynamics
module Atmosphere / Mesh
module Atmosphere / Mesh
module Atmosphere / Mesh
module ATMOSPHERE physics / Cloud Microphysics
subroutine, public atmosphympvars_getlocalmeshfields_sfcflx(domid, mesh, sfcflx_list, sflx_rain, sflx_snow, sflx_engi)
module ATMOSPHERE physics / cloud microphysics
module ATMOSPHERE physics / surface process
module ATMOSPHERE physics / sub-grid scale turbulence process
module ATMOSPHERE / Variables
subroutine, public atmosvars_getlocalmeshsfcvar(domid, mesh, auxvars2d_list, prec, prec_engi, lcmesh2d)
subroutine, public atmosvars_getlocalmeshphytends(domid, mesh, phytends_list, dens_tp, momx_tp, momy_tp, momz_tp, rhot_tp, rhoh_p, rhoq_tp, lcmesh3d)
module FElib / Fluid dyn solver / Atmosphere / Nonhydrostatic model / Common
subroutine, public file_history_meshfield_setup(mesh1d_, mesh2d_, mesh3d_, meshcubedsphere2d_, meshcubedsphere3d_)
module FElib / Mesh / Local 2D
module FElib / Mesh / Local 3D
module FElib / Mesh / Base 2D
module FElib / Mesh / Base 3D
module FElib / Mesh / Base
FElib / model framework / model component.
FElib / model framework / mesh manager.
module common / time
subroutine, public time_manager_regist_component(tmanager_comp)
Derived type to manage a component of atmospheric dynamics.
Derived type to manage a computational mesh of global atmospheric model.
Derived type to manage a computational mesh of regional atmospheric model.
Derived type to manage a component of cloud microphysics.
Derived type to manage a component of surface process.
Derived type to manage a component of sub-grid scale turbulent process.