12 use scale_const,
only: &
16 cpdry => const_cpdry, &
17 cvdry => const_cvdry, &
41 character(len=H_SHORT) :: label
43 procedure(exp_geostrophic_balance_correction_lc),
pointer :: geostrophic_balance_correction_lc => null()
45 procedure,
public :: init_base => experiment_init
46 generic :: init => init_base
47 procedure,
public :: final_base => experiment_final
48 generic :: final => final_base
49 procedure,
public :: setinitcond => experiment_setinitcond
50 procedure,
public :: regist_setinitcond => experiment_regist_set_initcond
51 procedure,
public :: regist_geostrophic_balance_correction => experiment_regist_geostrophic_balance_correction
60 this, DENS_hyd, PRES_hyd, DDENS, MOMX, MOMY, MOMZ, DRHOT, &
62 x, y, z, dom_xmin, dom_xmax, dom_ymin, dom_ymax, dom_zmin, &
63 dom_zmax, lcmesh, elem )
74 real(RP),
intent(out) :: DENS_hyd(elem%Np,lcmesh%NeA)
75 real(RP),
intent(out) :: PRES_hyd(elem%Np,lcmesh%NeA)
76 real(RP),
intent(out) :: DDENS(elem%Np,lcmesh%NeA)
77 real(RP),
intent(out) :: MOMX(elem%Np,lcmesh%NeA)
78 real(RP),
intent(out) :: MOMY(elem%Np,lcmesh%NeA)
79 real(RP),
intent(out) :: MOMZ(elem%Np,lcmesh%NeA)
80 real(RP),
intent(out) :: DRHOT(elem%Np,lcmesh%NeA)
82 real(RP),
intent(in) :: x(elem%Np,lcmesh%Ne)
83 real(RP),
intent(in) :: y(elem%Np,lcmesh%Ne)
84 real(RP),
intent(in) :: z(elem%Np,lcmesh%Ne)
85 real(RP),
intent(in) :: dom_xmin, dom_xmax
86 real(RP),
intent(in) :: dom_ymin, dom_ymax
87 real(RP),
intent(in) :: dom_zmin, dom_zmax
90 subroutine exp_geostrophic_balance_correction_lc( this, &
91 DENS_hyd, PRES_hyd, DDENS, MOMX, MOMY, MOMZ, DRHOT, &
102 real(RP),
intent(inout) :: DENS_hyd(elem%Np,lcmesh%NeA)
103 real(RP),
intent(in) :: PRES_hyd(elem%Np,lcmesh%NeA)
104 real(RP),
intent(inout) :: DDENS(elem%Np,lcmesh%NeA)
105 real(RP),
intent(inout) :: MOMX(elem%Np,lcmesh%NeA)
106 real(RP),
intent(inout) :: MOMY(elem%Np,lcmesh%NeA)
107 real(RP),
intent(inout) :: MOMZ(elem%Np,lcmesh%NeA)
108 real(RP),
intent(inout) :: DRHOT(elem%Np,lcmesh%NeA)
109 end subroutine exp_geostrophic_balance_correction_lc
129 subroutine experiment_init( this, exp_name )
132 character(len=*),
intent(in) :: exp_name
135 this%label = exp_name
137 this%setInitCond_lc => experiment_setinitcond_lc_dummy
138 this%geostrophic_balance_correction_lc => experiment_geostrophic_balance_correction_lc_dummy
141 end subroutine experiment_init
143 subroutine experiment_final( this )
149 end subroutine experiment_final
151 subroutine experiment_regist_set_initcond( this, exp_SetInitCond_lc )
157 DENS_hyd, PRES_hyd, DDENS, MOMX, MOMY, MOMZ, DRHOT, &
159 x, y, z, dom_xmin, dom_xmax, dom_ymin, dom_ymax, dom_zmin, &
160 dom_zmax, lcmesh, elem )
171 real(RP),
intent(out) :: DENS_hyd(elem%Np,lcmesh%NeA)
172 real(RP),
intent(out) :: PRES_hyd(elem%Np,lcmesh%NeA)
173 real(RP),
intent(out) :: DDENS(elem%Np,lcmesh%NeA)
174 real(RP),
intent(out) :: MOMX(elem%Np,lcmesh%NeA)
175 real(RP),
intent(out) :: MOMY(elem%Np,lcmesh%NeA)
176 real(RP),
intent(out) :: MOMZ(elem%Np,lcmesh%NeA)
177 real(RP),
intent(out) :: DRHOT(elem%Np,lcmesh%NeA)
179 real(RP),
intent(in) :: x(elem%Np,lcmesh%Ne)
180 real(RP),
intent(in) :: y(elem%Np,lcmesh%Ne)
181 real(RP),
intent(in) :: z(elem%Np,lcmesh%Ne)
182 real(RP),
intent(in) :: dom_xmin, dom_xmax
183 real(RP),
intent(in) :: dom_ymin, dom_ymax
184 real(RP),
intent(in) :: dom_zmin, dom_zmax
191 end subroutine experiment_regist_set_initcond
193 subroutine experiment_regist_geostrophic_balance_correction( this, exp_geostrophic_balance_correction_lc )
197 subroutine exp_geostrophic_balance_correction_lc( this, &
198 DENS_hyd, PRES_hyd, DDENS, MOMX, MOMY, MOMZ, DRHOT, &
209 real(RP),
intent(inout) :: DENS_hyd(elem%Np,lcmesh%NeA)
210 real(RP),
intent(in) :: PRES_hyd(elem%Np,lcmesh%NeA)
211 real(RP),
intent(inout) :: DDENS(elem%Np,lcmesh%NeA)
212 real(RP),
intent(inout) :: MOMX(elem%Np,lcmesh%NeA)
213 real(RP),
intent(inout) :: MOMY(elem%Np,lcmesh%NeA)
214 real(RP),
intent(inout) :: MOMZ(elem%Np,lcmesh%NeA)
215 real(RP),
intent(inout) :: DRHOT(elem%Np,lcmesh%NeA)
216 end subroutine exp_geostrophic_balance_correction_lc
220 this%geostrophic_balance_correction_lc => exp_geostrophic_balance_correction_lc
222 end subroutine experiment_regist_geostrophic_balance_correction
224 subroutine experiment_setinitcond( this, &
225 model_mesh, atm_prgvars_manager, atm_auxvars_manager, atm_trcvars_manager )
227 use scale_tracer,
only: qa
245 class(
atmosmesh),
target,
intent(in) :: model_mesh
268 mesh => model_mesh%ptr_mesh
270 do n=1, mesh%LOCAL_MESH_NUM
272 mesh, atm_prgvars_manager, atm_auxvars_manager, &
273 ddens, momx, momy, momz, drhot, &
274 dens_hyd, pres_hyd, rtot, cvtot, cptot, &
279 iq, tracer_field_list(iq)%ptr )
284 call this%setInitCond_lc( &
285 dens_hyd%val, pres_hyd%val, &
286 ddens%val, momx%val, momy%val, momz%val, drhot%val, &
288 lcmesh3d%pos_en(:,:,1), lcmesh3d%pos_en(:,:,2), lcmesh3d%pos_en(:,:,3), &
289 mesh%xmin_gl, mesh%xmax_gl, mesh%ymin_gl, mesh%ymax_gl, mesh%zmin_gl, mesh%zmax_gl, &
290 lcmesh3d, lcmesh3d%refElem3D )
292 call this%setInitCond_lc( &
293 dens_hyd%val, pres_hyd%val, &
294 ddens%val, momx%val, momy%val, momz%val, drhot%val, &
296 lcmesh3d%pos_en(:,:,1), lcmesh3d%pos_en(:,:,2), lcmesh3d%pos_en(:,:,3), &
297 mesh%xmin_gl, mesh%xmax_gl, mesh%ymin_gl, mesh%ymax_gl, mesh%zmin_gl, mesh%zmax_gl, &
298 lcmesh3d, lcmesh3d%refElem3D )
305 select type(field_ptr)
307 hydvars_comm_list(1)%field3d => field_ptr
311 call hydvars_comm_rm%Init(1, 0, 0, mesh)
312 hydvars_comm => hydvars_comm_rm
314 call hydvars_comm_gm%Init(1, 0, 0, mesh)
315 hydvars_comm => hydvars_comm_gm
318 call hydvars_comm%Put(hydvars_comm_list, 1)
319 call hydvars_comm%Exchange()
320 call hydvars_comm%Get(hydvars_comm_list, 1)
323 do n=1, mesh%LOCAL_MESH_NUM
325 mesh, atm_prgvars_manager, atm_auxvars_manager, &
326 ddens, momx, momy, momz, drhot, &
327 dens_hyd, pres_hyd, rtot, cvtot, cptot, &
330 call this%geostrophic_balance_correction_lc( &
331 dens_hyd%val, pres_hyd%val, &
332 ddens%val, momx%val, momy%val, momz%val, drhot%val, &
333 lcmesh3d, lcmesh3d%refElem3D )
337 select type(field_ptr)
339 hydvars_comm_list(1)%field3d => field_ptr
341 call hydvars_comm%Put(hydvars_comm_list, 1)
342 call hydvars_comm%Exchange()
343 call hydvars_comm%Get(hydvars_comm_list, 1)
347 call hydvars_comm_rm%Final()
349 call hydvars_comm_gm%Final()
353 end subroutine experiment_setinitcond
357 subroutine experiment_setinitcond_lc_dummy( this, &
358 DENS_hyd, PRES_hyd, DDENS, MOMX, MOMY, MOMZ, DRHOT, tracer_field_list, &
359 x, y, z, dom_xmin, dom_xmax, dom_ymin, dom_ymax, dom_zmin, dom_zmax, &
366 real(RP),
intent(out) :: DENS_hyd(elem%Np,lcmesh%NeA)
367 real(RP),
intent(out) :: PRES_hyd(elem%Np,lcmesh%NeA)
368 real(RP),
intent(out) :: DDENS(elem%Np,lcmesh%NeA)
369 real(RP),
intent(out) :: MOMX(elem%Np,lcmesh%NeA)
370 real(RP),
intent(out) :: MOMY(elem%Np,lcmesh%NeA)
371 real(RP),
intent(out) :: MOMZ(elem%Np,lcmesh%NeA)
372 real(RP),
intent(out) :: DRHOT(elem%Np,lcmesh%NeA)
374 real(RP),
intent(in) :: x(elem%Np,lcmesh%Ne)
375 real(RP),
intent(in) :: y(elem%Np,lcmesh%Ne)
376 real(RP),
intent(in) :: z(elem%Np,lcmesh%Ne)
377 real(RP),
intent(in) :: dom_xmin, dom_xmax
378 real(RP),
intent(in) :: dom_ymin, dom_ymax
379 real(RP),
intent(in) :: dom_zmin, dom_zmax
383 end subroutine experiment_setinitcond_lc_dummy
385 subroutine experiment_geostrophic_balance_correction_lc_dummy( this, &
386 DENS_hyd, PRES_hyd, DDENS, MOMX, MOMY, MOMZ, DRHOT, &
393 real(RP),
intent(inout) :: DENS_hyd(elem%Np,lcmesh%NeA)
394 real(RP),
intent(in) :: PRES_hyd(elem%Np,lcmesh%NeA)
395 real(RP),
intent(inout) :: DDENS(elem%Np,lcmesh%NeA)
396 real(RP),
intent(inout) :: MOMX(elem%Np,lcmesh%NeA)
397 real(RP),
intent(inout) :: MOMY(elem%Np,lcmesh%NeA)
398 real(RP),
intent(inout) :: MOMZ(elem%Np,lcmesh%NeA)
399 real(RP),
intent(inout) :: DRHOT(elem%Np,lcmesh%NeA)
402 end subroutine experiment_geostrophic_balance_correction_lc_dummy
404end module mod_experiment
module ATMOSPHERE / Variables
subroutine, public atmosvars_getlocalmeshprgvars(domid, mesh, prgvars_list, auxvars_list, ddens, momx, momy, momz, therm, dens_hyd, pres_hyd, rtot, cvtot, cptot, lcmesh3d)
subroutine, public atmosvars_getlocalmeshqtrcvar(domid, mesh, trcvars_list, varid, var, lcmesh3d)
module FElib / Fluid dyn solver / Atmosphere / Nonhydrostatic model / Common
integer, parameter, public auxvar_preshydro_id
integer, parameter, public auxvar_denshydro_id
module FElib / Element / Base
module FElib / Element / hexahedron
module FElib / Mesh / Local 3D
module FElib / Data / base
module FElib / Mesh / Base 3D
module FElib / Mesh / Cubic 3D domain
module FElib / Mesh / Cubed-sphere 3D domain
module FElib / Data / base
module FElib / Data / Communication base
module FElib / Data / Communication 3D cubic domain
module FElib / Data / Communication in 3D cubed-sphere domain
FElib / model framework / variable manager.
Base derived type to manage data communication.