8 use atlas_module,
only: atlas_geometry, atlas_field, atlas_fieldset, atlas_real
9 use fckit_configuration_module,
only: fckit_configuration
10 use fckit_log_module,
only: fckit_log
14 use kinds,
only: kind_real
15 use oops_variables_mod
24 use mpas_derived_types
25 use mpas_kind_types,
only: strkind
26 use mpas_pool_routines
57 character(len=StrKIND) :: kind_op
60 if (x1%geom%nCells==x2%geom%nCells .and. x1%geom%nVertLevels==x2%geom%nVertLevels)
then
61 if (lhs%geom%nCells==x1%geom%nCells .and. lhs%geom%nVertLevels==x1%geom%nVertLevels)
then
63 call da_operator(trim(kind_op), lhs % subFields, x1 % subFields, x2 % subFields, fld_select = lhs % fldnames_ci)
65 call abor1_ftn(
"mpas_increment:diff_incr: dimension mismatch between the two variables.")
68 call abor1_ftn(
"mpas_increment:diff_incr: states not at same resolution")
81 type(fckit_configuration),
intent(in) :: f_conf
82 character(len=:),
allocatable :: str
83 integer :: ndir, idir, ildir, ndirlocal
84 character(len=3) :: idirchar
85 character(len=StrKIND) :: dirvar
86 type (mpas_pool_iterator_type) :: poolitr
87 real (kind=kind_real),
dimension(:,:),
pointer :: r2d_ptr_a
88 real (kind=kind_real),
dimension(:),
pointer :: r1d_ptr_a
89 integer :: nearestcell
90 integer,
allocatable,
dimension(:) :: dirowned, dirownedglobal
91 real (kind=kind_real),
allocatable,
dimension(:) :: dirlats
92 real (kind=kind_real),
allocatable,
dimension(:) :: dirlons
93 integer,
allocatable,
dimension(:) :: dircells
96 call f_conf%get_or_die(
"ndir",ndir)
98 allocate( dirowned(ndir) )
99 allocate( dircells(ndir) )
101 call f_conf%get_or_die(
"dirLats",dirlats)
102 call f_conf%get_or_die(
"dirLons",dirlons)
104 call f_conf%get_or_die(
"ildir",ildir)
105 call f_conf%get_or_die(
"dirvar",str)
113 nearestcell = self % geom % nCellsSolve
116 nearestcell, self % geom % nCells, self % geom % maxEdges, &
117 self % geom % nEdgesOnCell, self % geom % cellsOnCell, &
118 self % geom % latCell, self % geom % lonCell )
120 if (nearestcell <= self % geom % nCellsSolve)
then
122 dircells(idir) = nearestcell
123 ndirlocal = ndirlocal + 1
126 dircells(idir) = self % geom % nCells + 1
130 write(
message,*)
'This processor owns ',ndirlocal,
' dirac forcing locations'
134 if (ndir<1)
call abor1_ftn(
"mpas_increment:dirac non-positive ndir")
136 allocate( dirownedglobal(ndir) )
137 call mpas_dmpar_max_int_array( self % geom % domain % dminfo, ndir, dirowned, dirownedglobal)
138 if ( any(dirownedglobal.lt.1) )
then
139 call abor1_ftn(
"mpas_increment:dirac invalid Lat/Lon")
142 call mpas_dmpar_sum_int_array( self % geom % domain % dminfo, ndir, dirowned, dirownedglobal)
143 if ( any(dirownedglobal.gt.1) )
then
144 call abor1_ftn(
"mpas_increment:duplicated dirac on >1 processors")
146 deallocate( dirownedglobal )
148 if ((ildir < 1) .or. (ildir > self % geom % nVertLevels))
then
149 call abor1_ftn(
"mpas_increment:dirac invalid ildir")
155 call mpas_pool_begin_iteration(self % subFields)
157 do while ( mpas_pool_get_next_member(self % subFields, poolitr) )
160 if (poolitr % memberType == mpas_pool_field)
then
162 write(
message,*)
'poolItr % nDims , poolItr % memberName =', poolitr % nDims , poolitr % memberName
165 if (poolitr % dataType == mpas_pool_real)
then
168 if( trim(dirvar) .eq. trim(poolitr % memberName) )
then
171 if ( dirowned(idir).eq.1 )
then
172 if (poolitr % nDims == 1)
then
173 call mpas_pool_get_array(self % subFields, trim(poolitr % memberName), r1d_ptr_a)
175 else if (poolitr % nDims == 2)
then
176 call mpas_pool_get_array(self % subFields, trim(poolitr % memberName), r2d_ptr_a)
178 else if (poolitr % nDims == 3)
then
179 call fckit_log%info (
'Not implemented yet')
181 ndirlocal = ndirlocal + 1
189 deallocate( dirowned )
190 deallocate( dirlats )
191 deallocate( dirlons )
192 deallocate( dircells )
203 integer function nearest_cell(target_lat, target_lon, start_cell, nCells, maxEdges, &
204 nEdgesOnCell, cellsOnCell, latCell, lonCell)
208 real (kind=kind_real),
intent(in) :: target_lat, target_lon
209 integer,
intent(in) :: start_cell
210 integer,
intent(in) :: ncells, maxedges
211 integer,
dimension(nCells),
intent(in) :: nedgesoncell
212 integer,
dimension(maxEdges,nCells),
intent(in) :: cellsoncell
213 real (kind=kind_real),
dimension(nCells),
intent(in) :: latcell, loncell
217 integer :: current_cell
218 real (kind=kind_real) :: current_distance, d
219 real (kind=kind_real) :: nearest_distance
220 type (atlas_geometry) :: ageometry
225 ageometry = atlas_geometry(
"UnitSphere")
229 current_distance = ageometry%distance(loncell(current_cell), latcell(current_cell), target_lon, target_lat)
231 nearest_distance = current_distance
232 do i = 1, nedgesoncell(current_cell)
233 icell = cellsoncell(i,current_cell)
234 if (icell <= ncells)
then
235 d = ageometry%distance(loncell(icell), latcell(icell), target_lon, target_lat)
236 if (d < nearest_distance)
then
253 type(oops_variables),
intent(in) :: vars
254 type(atlas_fieldset),
intent(inout) :: afieldset
256 integer :: jvar, nlevels
258 type(atlas_field) :: afield
259 type(mpas_pool_iterator_type) :: poolitr
261 do jvar = 1,vars%nvars()
263 call mpas_pool_begin_iteration(self%subFields)
264 do while (mpas_pool_get_next_member(self%subFields, poolitr))
265 if (trim(vars%variable(jvar))==trim(poolitr%memberName))
then
266 if (.not.afieldset%has_field(vars%variable(jvar)))
then
268 if (poolitr%nDims==1)
then
270 else if (poolitr%nDims==2)
then
271 nlevels = geom%nVertLevels
272 else if (poolitr%nDims==3)
then
273 call abor1_ftn(
'not implemented yet')
275 afield = geom%afunctionspace%create_field(name=vars%variable(jvar),kind=atlas_real(kind_real),levels=nlevels)
278 call afieldset%add(afield)
289 if (.not.var_found)
call abor1_ftn(
'variable '//trim(vars%variable(jvar))//
' not found in increment')
302 type(oops_variables),
intent(in) :: vars
303 type(atlas_fieldset),
intent(inout) :: afieldset
305 integer :: jvar, nlevels
306 real(kind=kind_real),
pointer :: real_ptr_1(:), real_ptr_2(:,:)
307 real(kind=kind_real),
pointer :: r1d_ptr_a(:), r2d_ptr_a(:,:)
309 type(atlas_field) :: afield
310 type(mpas_pool_iterator_type) :: poolitr
312 do jvar = 1,vars%nvars()
314 call mpas_pool_begin_iteration(self%subFields)
315 do while (mpas_pool_get_next_member(self%subFields, poolitr))
316 if (trim(vars%variable(jvar))==trim(poolitr%memberName))
then
317 if (afieldset%has_field(vars%variable(jvar)))
then
319 afield = afieldset%field(vars%variable(jvar))
322 if (poolitr%nDims==1)
then
324 else if (poolitr%nDims==2)
then
325 nlevels = geom%nVertLevels
326 else if (poolitr%nDims==3)
then
327 call abor1_ftn(
'not implemented yet')
329 afield = geom%afunctionspace%create_field(name=vars%variable(jvar),kind=atlas_real(kind_real),levels=nlevels)
332 call afieldset%add(afield)
336 if (poolitr%nDims==1)
then
337 call afield%data(real_ptr_1)
338 call mpas_pool_get_array(self%subFields, trim(poolitr%memberName), r1d_ptr_a)
339 real_ptr_1 = r1d_ptr_a(1:geom%nCellsSolve)
340 else if (poolitr%nDims==2)
then
341 call afield%data(real_ptr_2)
342 call mpas_pool_get_array(self%subFields, trim(poolitr%memberName), r2d_ptr_a)
343 real_ptr_2 = r2d_ptr_a(1:geom%nVertLevels,1:geom%nCellsSolve)
354 if (.not.var_found)
call abor1_ftn(
'variable '//trim(vars%variable(jvar))//
' not found in increment')
367 type(oops_variables),
intent(in) :: vars
368 type(atlas_fieldset),
intent(in) :: afieldset
371 real(kind=kind_real),
pointer :: real_ptr_1(:), real_ptr_2(:,:)
372 real(kind=kind_real),
pointer :: r1d_ptr_a(:), r2d_ptr_a(:,:)
374 type(atlas_field) :: afield
375 type(mpas_pool_iterator_type) :: poolitr
377 do jvar = 1,vars%nvars()
379 call mpas_pool_begin_iteration(self%subFields)
380 do while (mpas_pool_get_next_member(self%subFields, poolitr))
381 if (trim(vars%variable(jvar))==trim(poolitr%memberName))
then
383 afield = afieldset%field(vars%variable(jvar))
386 if (poolitr%nDims==1)
then
387 call afield%data(real_ptr_1)
388 call mpas_pool_get_array(self%subFields, trim(poolitr%memberName), r1d_ptr_a)
389 r1d_ptr_a(1:geom%nCellsSolve) = real_ptr_1
390 else if (poolitr%nDims==2)
then
391 call afield%data(real_ptr_2)
392 call mpas_pool_get_array(self%subFields, trim(poolitr%memberName), r2d_ptr_a)
393 r2d_ptr_a(1:geom%nVertLevels,1:geom%nCellsSolve) = real_ptr_2
394 else if (poolitr%nDims==3)
then
395 call abor1_ftn(
'not implemented yet')
406 if (.not.var_found)
call abor1_ftn(
'variable '//trim(vars%variable(jvar))//
' not found in increment')
integer, parameter max_string
character(max_string) message
subroutine, public da_operator(kind_op, pool_a, pool_b, pool_c, fld_select)
Performs A = A 'kind_op' B for pools A and B.
real(kind=kind_real), parameter mpas_jedi_deg2rad_kr
real(kind=kind_real), parameter mpas_jedi_one_kr
subroutine, public set_atlas(self, geom, vars, afieldset)
subroutine, public to_atlas(self, geom, vars, afieldset)
integer function nearest_cell(target_lat, target_lon, start_cell, nCells, maxEdges, nEdgesOnCell, cellsOnCell, latCell, lonCell)
subroutine, public diff_incr(lhs, x1, x2)
subroutine, public dirac(self, f_conf)
subroutine, public from_atlas(self, geom, vars, afieldset)
Fortran derived type to hold MPAS field.
Fortran derived type to hold geometry definition.