FE-Project
Loading...
Searching...
No Matches
mod_atmos_mesh_gm.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_prc
20
28 use scale_sparsemat, only: sparsemat
31
34
35 use mod_atmos_mesh, only: &
37
38 !-----------------------------------------------------------------------------
39 implicit none
40 private
41 !-----------------------------------------------------------------------------
42 !
43 !++ Public type & procedures
44 !
45
48 type, extends(atmosmesh), public :: atmosmeshgm
51 contains
52 procedure :: init => atmosmeshgm_init
53 procedure :: final => atmosmeshgm_final
54 procedure :: create_communicator => atmosmeshgm_create_communicator
55 procedure :: setup_restartfile1 => atmosmeshgm_setup_restartfile1
56 procedure :: setup_restartfile2 => atmosmeshgm_setup_restartfile2
57 procedure :: calc_uvmet => atmosmeshgm_calc_uvmet
58 procedure :: setup_vcoordinate => atmosmeshgm_setup_vcoordinate
59 end type atmosmeshgm
60
61 !-----------------------------------------------------------------------------
62 !
63 !++ Public parameters & variables
64 !
65
66 !-----------------------------------------------------------------------------
67 !
68 !++ Private procedures
69 !
70 !-------------------
71
72 !-----------------------------------------------------------------------------
73 !
74 !++ Private parameters & variables
75 !
76
77contains
78
81!OCL SERIAL
82 subroutine atmosmeshgm_init( this )
83 use scale_const, only: &
84 rplanet => const_radius
85 use scale_mesh_base2d, only: &
86 mftype2d_xy => meshbase2d_dimtypeid_xy
87 use scale_meshutil_vcoord, only: &
89
90 implicit none
91 class(atmosmeshgm), target, intent(inout) :: this
92
93 real(RP) :: dom_zmin = 0.0_rp
94 real(RP) :: dom_zmax = 10.0e3_rp
95 logical :: isPeriodicZ = .false.
96
97 integer, parameter :: FZ_nmax = 1000
98 real(RP) :: FZ(FZ_nmax)
99
100 !* Global
101 logical :: SHALLOW_ATM_APPROX_FLAG = .true.
102 integer :: NeGX = 2
103 integer :: NeGY = 2
104 integer :: NeZ = 2
105 integer :: NLocalMeshPerPrc = 6
106 integer :: Nprc = 1
107 integer :: PolyOrder_h = 2
108 integer :: PolyOrder_v = 2
109 logical :: LumpedMassMatFlag = .false.
110
111 character(len=H_LONG) :: TOPO_IN_BASENAME = ''
112 character(len=H_MID) :: TOPO_IN_VARNAME = 'topo'
113 character(len=H_MID) :: VERTICAL_COORD_NAME = "TERRAIN_FOLLOWING"
114
115 logical :: COMM_USE_MPI_PC = .false.
116
117 character(len=H_SHORT) :: Element_operation_type = 'General'
118 character(len=H_SHORT) :: SpMV_storage_format = 'ELL'
119
120 namelist / param_atmos_mesh / &
121 shallow_atm_approx_flag, &
122 dom_zmin, dom_zmax, &
123 fz, isperiodicz, &
124 negx, negy, nez, nlocalmeshperprc, nprc, &
125 polyorder_h, polyorder_v, lumpedmassmatflag, &
126 element_operation_type, &
127 spmv_storage_format, &
128 vertical_coord_name, &
129 topo_in_basename, topo_in_varname, &
130 comm_use_mpi_pc
131
132 integer :: k
133 logical :: is_spec_FZ
134
135 integer :: ierr
136
137 type(file_base_meshfield) :: file_topo
138 !-------------------------------------------
139
140 log_newline
141 log_info("ATMOS_MESH_setup",*) 'Setup'
142
143 fz(:) = -1.0_rp
144
145 rewind(io_fid_conf)
146 read(io_fid_conf,nml=param_atmos_mesh,iostat=ierr)
147 if( ierr < 0 ) then !--- missing
148 log_info("ATMOS_MESH_setup",*) 'Not found namelist. Default used.'
149 elseif( ierr > 0 ) then !--- fatal error
150 log_error("ATMOS_MESH_setup",*) 'Not appropriate names in namelist PARAM_ATM_MESH. Check!'
151 call prc_abort
152 endif
153 log_nml(param_atmos_mesh)
154
155 !----
156
157 !- Setup the element
158
159 call this%element%Init( polyorder_h, polyorder_v, lumpedmassmatflag )
160 call this%element_v1D%Init( polyorder_v, lumpedmassmatflag )
161
162 !- Setup the mesh
163
164 is_spec_fz = .true.
165 do k=1, nez+1
166 if (fz(k) < 0.0_rp) then
167 is_spec_fz = .false.
168 end if
169 end do
170 if (is_spec_fz) then
171 call this%mesh%Init( &
172 negx, negy, nez, rplanet, dom_zmin, dom_zmax, &
173 this%element, nlocalmeshperprc, nproc=nprc, &
174 fz=fz(1:nez+1), shallow_approx=shallow_atm_approx_flag )
175 else
176 call this%mesh%Init( &
177 negx, negy, nez, rplanet, dom_zmin, dom_zmax, &
178 this%element, nlocalmeshperprc, nproc=nprc, &
179 shallow_approx=shallow_atm_approx_flag )
180 end if
181
182 call this%mesh%Generate()
183
184 !-
185
186 call this%AtmosMesh_Init( this%mesh )
187 call this%PrepairElementOperation( element_operation_type, spmv_storage_format )
188
189 !- Set topography & vertical coordinate
190
191 if ( topo_in_basename /= '' ) then
192 log_info("ATMOS_MESH_setup",*) 'Read topography data'
193
194 call file_topo%Init(1, meshcubedsphere2d=this%mesh%mesh2D )
195 call file_topo%Open( topo_in_basename, myrank=prc_myrank )
196 call file_topo%Read_Var( mftype2d_xy, topo_in_varname, this%topography%topo )
197 call file_topo%Close()
198 call file_topo%Final()
199 end if
200
201 this%vcoord_type_id = meshutil_get_vcoord_typeid( vertical_coord_name )
202 call this%Setup_vcoordinate()
203
204 !-
205 this%comm_use_mpi_pc = comm_use_mpi_pc
206
207 return
208 end subroutine atmosmeshgm_init
209
212!OCL SERIAL
213 subroutine atmosmeshgm_final(this)
214 implicit none
215
216 class(atmosmeshgm), intent(inout) :: this
217 integer :: commid
218 !-------------------------------------------
219
220 do commid=1, this%communicator_num
221 call this%comm_list(commid)%Final()
222 end do
223
224 call this%mesh%Final()
225 call this%AtmosMesh_Final()
226
227 return
228 end subroutine atmosmeshgm_final
229
230!OCL SERIAL
231 subroutine atmosmeshgm_create_communicator( this, sfield_num, hvfield_num, htensorfield_num, &
232 var_manager, field_list, commid )
233 implicit none
234 class(atmosmeshgm), target, intent(inout) :: this
235 integer, intent(in) :: sfield_num
236 integer, intent(in) :: hvfield_num
237 integer, intent(in) :: htensorfield_num
238 class(modelvarmanager), intent(inout) :: var_manager
239 class(meshfield3d), intent(in) :: field_list(:)
240 integer, intent(out) :: commid
241 !-----------------------------------------------------
242
243 commid = this%Get_communicatorID( atm_mesh_max_commnuicator_num )
244 call this%comm_list(commid)%Init( sfield_num, hvfield_num, htensorfield_num, this%mesh )
245 if ( this%comm_use_mpi_pc ) call this%comm_list(commid)%Prepare_PC()
246 call var_manager%MeshFieldComm_Prepair( this%comm_list(commid), field_list )
247
248 return
249 end subroutine atmosmeshgm_create_communicator
250
251!OCL SERIAL
252 subroutine atmosmeshgm_setup_restartfile1( this, restart_file, var_num )
253 implicit none
254 class(atmosmeshgm), target, intent(inout) :: this
255 class(file_restart_meshfield_component), intent(inout) :: restart_file
256 integer, intent(in) :: var_num
257 !------------------------------------------------
258
259 call restart_file%Init('ATMOS', var_num, meshcubedsphere3d=this%mesh )
260 return
261 end subroutine atmosmeshgm_setup_restartfile1
262
263!OCL SERIAL
264 subroutine atmosmeshgm_setup_restartfile2( this, restart_file, &
265 in_basename, in_postfix_timelabel, &
266 out_basename, out_postfix_timelabel, &
267 out_dtype, out_title, var_num )
268 implicit none
269 class(atmosmeshgm), target, intent(inout) :: this
270 class(file_restart_meshfield_component), intent(inout) :: restart_file
271 character(*), intent(in) :: in_basename
272 logical, intent(in) :: in_postfix_timelabel
273 character(*), intent(in) :: out_basename
274 logical, intent(in) :: out_postfix_timelabel
275 character(*), intent(in) :: out_title
276 character(*), intent(in) :: out_dtype
277 integer, intent(in) :: var_num
278 !-----------------------------------------------------------
279
280 call restart_file%Init('ATMOS', in_basename, in_postfix_timelabel, &
281 out_basename, out_postfix_timelabel, out_dtype, out_title, var_num, &
282 meshcubedsphere3d=this%mesh )
283
284 end subroutine atmosmeshgm_setup_restartfile2
285
286!OCL SERIAL
287 subroutine atmosmeshgm_calc_uvmet( this, U, V, &
288 Umet, Vmet )
289
290 use scale_cubedsphere_coord_cnv, only: &
292 implicit none
293 class(atmosmeshgm), target, intent(in) :: this
294 type(meshfield3d), intent(in) :: U
295 type(meshfield3d), intent(in) :: V
296 type(meshfield3d), intent(inout) :: Umet
297 type(meshfield3d), intent(inout) :: Vmet
298
299 integer :: n
300 integer :: ke, ke2D
301 type(localmesh3d), pointer :: lcmesh
302 class(elementbase3d), pointer :: elem
303 !------------------------------------------
304
305 do n=1, this%mesh%LOCAL_MESH_NUM
306 lcmesh => this%mesh%lcmesh_list(n)
307 elem => lcmesh%refElem3D
309 lcmesh%panelID, lcmesh%pos_en(:,:,1), lcmesh%pos_en(:,:,2), & ! (in)
310 lcmesh%gam, elem%Np * lcmesh%Ne, & ! (in)
311 u%local(n)%val(:,lcmesh%NeS:lcmesh%NeE), & ! (in)
312 v%local(n)%val(:,lcmesh%NeS:lcmesh%NeE), & ! (in)
313 umet%local(n)%val(:,lcmesh%NeS:lcmesh%NeE), & ! (out)
314 vmet%local(n)%val(:,lcmesh%NeS:lcmesh%NeE) ) ! (out)
315 end do
316
317 return
318 end subroutine atmosmeshgm_calc_uvmet
319
320!OCL SERIAL
321 subroutine atmosmeshgm_setup_vcoordinate( this )
323 implicit none
324 class(atmosmeshgm), TARGET, INTENT(INOUT) :: this
325
326 type(meshfieldcommcubedspheredom3d) :: comm3D
327 type(meshfieldcommcubedspheredom2d) :: comm2D
328 !-------------------------------------------------
329
330 call comm2d%Init( 1, 0, 0, this%mesh%mesh2D )
331 call comm3d%Init( 2, 1, 0, this%mesh )
332
333 call this%topography%SetVCoordinate( this%ptr_mesh, &
334 this%vcoord_type_id, this%mesh%zmax_gl, comm3d, comm2d )
335
336 call comm2d%Final()
337 call comm3d%Final()
338
339 return
340 end SUBROUTINE atmosmeshgm_setup_vcoordinate
341
342end module mod_atmos_mesh_gm
module Atmosphere / Mesh
subroutine atmosmeshgm_init(this)
Initialize a object to manage computational mesh.
module Atmosphere / Mesh
integer, parameter, public atm_mesh_max_commnuicator_num
module common / Coordinate conversion with a cubed-sphere
subroutine, public cubedspherecoordcnv_cs2lonlatvec(panelid, alpha, beta, gam, np, vecalpha, vecbeta, veclon, veclat, lat)
module FElib / Element / Base
module FElib / Element / hexahedron
module FElib / Mesh / Local 3D
module FElib / Mesh / Base 2D
integer, public meshbase2d_dimtypeid_xy
module FElib / Mesh / Base 3D
module FElib / Mesh / Cubed-sphere 3D domain
module FElib / Data / base
module FElib / Data / Communication in 2D cubed-sphere domain
module FElib / Data / Communication in 3D cubed-sphere domain
module FElib / Mesh / utility for general vertical coordinate
integer function, public meshutil_get_vcoord_typeid(vcoord_type)
FElib / model framework / mesh manager.
FElib / model framework / variable manager.
module common / sparsemat
Derived type to manage a computational mesh of global atmospheric model.