MPAS-JEDI
mpasjedi_lvc_model2geovars_mod.F90
Go to the documentation of this file.
1 ! (C) Copyright 2020 UCAR
2 !
3 ! This software is licensed under the terms of the Apache Licence Version 2.0
4 ! which can be obtained at http://www.apache.org/licenses/LICENSE-2.0.
5 
7 
8 use iso_c_binding
9 
10 use fckit_configuration_module, only: fckit_configuration
11 use fckit_log_module, only: fckit_log
12 
13 !oops
14 use kinds, only : kind_real
15 
16 !ufo
17 use gnssro_mod_transform, only: geometric2geop
18 use ufo_vars_mod
19 
20 !MPAS-Model
21 use mpas_derived_types
22 use mpas_field_routines
23 use mpas_kind_types, only: rkind
24 use mpas_pool_routines
25 
26 !mpas-jedi
29 use mpas_geom_mod, only: mpas_geom
31 
32 !TODO: package the variable changes somewhere
34 !use mpas_vc_utils
35 
36 implicit none
37 
38 private
40 
42  type(mpas_pool_type), pointer :: trajectory => null()
43  contains
44  procedure, public :: create
45  procedure, public :: delete
46  procedure, public :: multiply
47  procedure, public :: multiplyadjoint
49 
50 ! --------------------------------------------------------------------------------------------------
51 
52 character(len=1024) :: message
53 
54 contains
55 
56 ! --------------------------------------------------------------------------------------------------
57 
58 subroutine create(self, geom, bg, fg, conf)
59 
60  class(mpasjedi_lvc_model2geovars), intent(inout) :: self
61  type(mpas_geom), intent(in) :: geom
62  type(mpas_fields), intent(in) :: bg
63  type(mpas_fields), intent(in) :: fg
64  type(fckit_configuration), intent(in) :: conf
65 
66  integer :: iVar
67 
68  character(len=MAXVARLEN), parameter :: &
69  trajFieldNames(4) = &
70  [ character(len=maxvarlen) :: &
71  'temperature', &
72  'spechum', &
73  'pressure', &
74  'surface_pressure' &
75  ]
76 
77  call da_template_pool(geom, self%trajectory, size(trajfieldnames), trajfieldnames)
78 
79  do ivar = 1, size(trajfieldnames)
80  call bg%copy_to(trajfieldnames(ivar), self%trajectory)
81  end do
82 
83 end subroutine create
84 
85 ! --------------------------------------------------------------------------------------------------
86 
87 subroutine delete(self)
88  class(mpasjedi_lvc_model2geovars), intent(inout) :: self
89  if (associated(self%trajectory)) then
90  call mpas_pool_destroy_pool(self%trajectory)
91  end if
92 end subroutine delete
93 
94 ! --------------------------------------------------------------------------------------------------
95 
96 subroutine multiply(self, geom, dxm, dxg)
97  class(mpasjedi_lvc_model2geovars), intent(inout) :: self
98  type(mpas_geom), intent(inout) :: geom !< mpas mesh descriptors
99  class(mpas_fields), intent(in) :: dxm !< model increment fields
100  class(mpas_fields), intent(inout) :: dxg !< increment containing linear geovar fields
101 
102  ! pool-related pointers
103  type(mpas_pool_type), pointer :: mFields_tl, gFields_tl
104  type(mpas_pool_data_type), pointer :: gdata
105 
106  ! reusable arrays
107  real(kind=kind_real), dimension(:), pointer :: ptrr1_a
108  real(kind=kind_real), dimension(:,:), pointer :: ptrr2_a, ptrr2_b, traj_ptrr2_a, traj_ptrr2_b
109  real(kind=kind_real), dimension(:,:), allocatable :: r2, trajr2
110 
111  ! iteration-specific variables
112  character(len=MAXVARLEN) :: geovar
113  integer :: nCells, nVertLevels, nVertLevelsP1
114  integer :: iVar
115 
116  ! air pressure on w levels
117  real(kind=kind_real), allocatable :: plevels(:,:)
118 
119  ! convenient local variables
120  mfields_tl => dxm % subFields
121  gfields_tl => dxg % subFields
122  ncells = geom%nCellsSolve
123  nvertlevels = geom%nVertLevels
124  nvertlevelsp1 = geom%nVertLevelsP1
125 
126  ! pre-calculate pressure on w levels
127  allocate(plevels(1:nvertlevelsp1,1:ncells))
128  call mpas_pool_get_array(self%trajectory, 'pressure', ptrr2_a)
129  call mpas_pool_get_array(self%trajectory, 'surface_pressure', ptrr1_a)
130  call pressure_half_to_full(ptrr2_a(:,1:ncells), geom%zgrid(:,1:ncells), ptrr1_a(1:ncells), &
131  ncells, nvertlevels, plevels)
132 
133  ! populate dxg
134  do ivar = 1, dxg % nf
135 
136  geovar = trim(dxg % fldnames(ivar))
137 
138  if (geom%has_identity(geovar)) then
139  ! "identity" variable changes are controlled in an external configuration file
140  ! through the geom object. Refer to the mpas_geom type for more information.
141  if (dxm%has(geom%identity(geovar))) then
142  call dxm%copy_to(geom%identity(geovar), dxg, geovar)
143  else
144  !note: this warning is specifically for pressure => air_pressure in GNSSRO
145  write(message,'(2A)') &
146  'WARNING: mpasjedi_lvc_model2geovars::multiply: '&
147  &'increment missing identity field for geovar => ', trim(geovar)
148  call fckit_log%warning(message)
149  end if
150  else
151 
152  call dxg%get(geovar, gdata)
153 
154  select case (trim(geovar))
155 
156  case ( var_tv ) !-virtual_temperature
157  ! get TL variables
158  call dxm%get('temperature', ptrr2_a)
159  call dxm%get('spechum', ptrr2_b)
160 
161  ! temporary work fields
162  allocate(r2(1:nvertlevels,1:ncells)) ! TL mixing_ratio
163  allocate(trajr2(1:nvertlevels,1:ncells)) ! NL mixing_ratio
164 
165  ! get linearization state
166  call mpas_pool_get_array(self%trajectory, 'temperature', traj_ptrr2_a)
167  call mpas_pool_get_array(self%trajectory, 'spechum', traj_ptrr2_b)
168  call q_to_w(traj_ptrr2_b(:,1:ncells), trajr2(:,1:ncells)) !NL coeff.
169 
170  ! calculations
171  call q_to_w_tl(ptrr2_b(:,1:ncells), traj_ptrr2_b(:,1:ncells), r2(:,1:ncells))
172  call tw_to_tv_tl(ptrr2_a(:,1:ncells), r2(:,1:ncells), &
173  traj_ptrr2_a(:,1:ncells), trajr2(:,1:ncells), &
174  gdata%r2%array(:,1:ncells))
175 
176  ! cleanup
177  deallocate(r2, trajr2)
178 
179  case ( var_mixr ) !-humidity_mixing_ratio
180  ! get TL variables
181  call dxm%get('spechum', ptrr2_a)
182 
183  ! get linearization state
184  call mpas_pool_get_array(self%trajectory, 'spechum', traj_ptrr2_a)
185 
186  ! calculations
187  call q_to_w_tl(ptrr2_a(:,1:ncells), traj_ptrr2_a(:,1:ncells), gdata%r2%array(:,1:ncells))
188  gdata%r2%array(:,1:ncells) = gdata%r2%array(:,1:ncells) * mpas_jedi_thousand_kr
189 
190  ! Ensure positive-definite mixing ratios
191  ! with respect to precision of crtm::CRTM_Parameters::ZERO.
192  ! TODO: this should be moved to the mpas_fields%read step
193  ! only other place it should be needed is add_incr (already there)
194  where (traj_ptrr2_a(:,1:ncells) <= mpas_jedi_zero_kr)
195  gdata%r2%array(:,1:ncells) = mpas_jedi_zero_kr
196  end where
197 
198  case ( var_clw ) !-mass_content_of_cloud_liquid_water_in_atmosphere_layer
199  call q_fields_tl('qc', mfields_tl, gdata%r2, plevels, ncells, nvertlevels)
200 
201  case ( var_cli ) !-mass_content_of_cloud_ice_in_atmosphere_layer
202  call q_fields_tl('qi', mfields_tl, gdata%r2, plevels, ncells, nvertlevels)
203 
204  case ( var_clr ) !-mass_content_of_rain_in_atmosphere_layer
205  call q_fields_tl('qr', mfields_tl, gdata%r2, plevels, ncells, nvertlevels)
206 
207  case ( var_cls ) !-mass_content_of_snow_in_atmosphere_layer
208  call q_fields_tl('qs', mfields_tl, gdata%r2, plevels, ncells, nvertlevels)
209 
210  case ( var_clg ) !-mass_content_of_graupel_in_atmosphere_layer
211  call q_fields_tl('qg', mfields_tl, gdata%r2, plevels, ncells, nvertlevels)
212 
213  case ( var_clh ) !-mass_content_of_hail_in_atmosphere_layer
214  call q_fields_tl('qh', mfields_tl, gdata%r2, plevels, ncells, nvertlevels)
215 
216  end select
217 
218  end if
219 
220  end do !iVar
221 
222  deallocate(plevels)
223 
224 
225 end subroutine multiply
226 
227 ! --------------------------------------------------------------------------------------------------
228 
229 subroutine multiplyadjoint(self, geom, dxg, dxm)
230  class(mpasjedi_lvc_model2geovars), intent(inout) :: self
231  type(mpas_geom), intent(inout) :: geom
232  class(mpas_fields), intent(in) :: dxg
233  class(mpas_fields), intent(inout) :: dxm
234 
235  ! pool-related pointers
236  type(mpas_pool_type), pointer :: mFields_ad, gFields_ad
237  type(mpas_pool_data_type), pointer :: gdata
238 
239  ! reusable array pointers
240  real(kind=kind_real), dimension(:), pointer :: ptrr1_a
241  real(kind=kind_real), dimension(:,:), pointer :: ptrr2_a, ptrr2_b, traj_ptrr2_a, traj_ptrr2_b
242  real(kind=kind_real), dimension(:,:), allocatable :: r2, trajr2
243 
244  ! iteration-specific variables
245  character(len=MAXVARLEN) :: geovar
246  integer :: nCells, nVertLevels, nVertLevelsP1
247  integer :: iVar
248 
249  ! air pressure on w levels
250  real(kind=kind_real), allocatable :: plevels(:,:)
251 
252  ! convenient local variables
253  mfields_ad => dxm % subFields
254  gfields_ad => dxg % subFields
255  ncells = geom%nCellsSolve
256  nvertlevels = geom%nVertLevels
257  nvertlevelsp1 = geom%nVertLevelsP1
258 
259  ! pre-calculate pressure on w levels
260  allocate(plevels(1:nvertlevelsp1,1:ncells))
261  call mpas_pool_get_array(self%trajectory, 'pressure', ptrr2_a)
262  call mpas_pool_get_array(self%trajectory, 'surface_pressure', ptrr1_a)
263  call pressure_half_to_full(ptrr2_a(:,1:ncells), geom%zgrid(:,1:ncells), ptrr1_a(1:ncells), &
264  ncells, nvertlevels, plevels)
265 
266  ! populate dxg
267  do ivar = 1, dxg % nf
268 
269  geovar = trim(dxg % fldnames(ivar))
270 
271  if (geom%has_identity(geovar)) then
272  ! "identity" variable changes are controlled in an external configuration file
273  ! through the geom object. Refer to the mpas_geom type for more information.
274  if (dxm%has(geom%identity(geovar))) then
275  call dxm%copy_to_ad(geom%identity(geovar), dxg, geovar)
276  else
277  !note: this warning is specifically for pressure => air_pressure in GNSSRO
278  write(message,'(2A)') &
279  'WARNING: mpasjedi_lvc_model2geovars::multiplyadjoint: '&
280  &'increment missing identity field for geovar => ', trim(geovar)
281  call fckit_log%warning(message)
282  end if
283  else
284 
285  call dxg%get(geovar, gdata)
286 
287  select case (trim(geovar))
288 
289  case ( var_tv ) !-virtual_temperature
290  ! get AD variables
291  call dxm%get('temperature', ptrr2_a)
292  call dxm%get('spechum', ptrr2_b)
293 
294  ! temporary work fields
295  allocate(r2(1:nvertlevels,1:ncells)) ! AD of mixing_ratio
296  allocate(trajr2(1:nvertlevels,1:ncells)) ! NL mixing_ratio
297 
298  ! get linearization state
299  call mpas_pool_get_array(self%trajectory, 'temperature', traj_ptrr2_a)
300  call mpas_pool_get_array(self%trajectory, 'spechum', traj_ptrr2_b)
301  call q_to_w(traj_ptrr2_b(:,1:ncells), trajr2(:,1:ncells)) !NL coeff.
302 
303  ! calculations
304  r2(:,1:ncells) = mpas_jedi_zero_kr !initialize local var.
305  call tw_to_tv_ad(ptrr2_a(:,1:ncells), r2(:,1:ncells), &
306  traj_ptrr2_a(:,1:ncells), trajr2(:,1:ncells), &
307  gdata%r2%array(:,1:ncells) )
308  call q_to_w_ad(ptrr2_b(:,1:ncells), traj_ptrr2_b(:,1:ncells), r2(:,1:ncells))
309 
310  ! cleanup
311  deallocate(r2, trajr2)
312 
313  case ( var_mixr ) !-humidity_mixing_ratio
314  ! get AD variables
315  call dxm%get('spechum', ptrr2_a)
316 
317  ! temporary work fields
318  allocate(r2(1:nvertlevels,1:ncells)) ! AD of var_mixr
319 
320  ! get linearization state
321  call mpas_pool_get_array(self%trajectory, 'spechum', traj_ptrr2_a)
322 
323  ! Ensure positive-definite mixing ratios
324  ! with respect to precision of crtm::CRTM_Parameters::ZERO.
325  ! TODO: this should be moved to the mpas_fields%read step
326  ! only other place it should be needed is add_incr (already there)
327  r2 = gdata%r2%array(1:nvertlevels,1:ncells)
328  where (traj_ptrr2_a(:,1:ncells) <= mpas_jedi_zero_kr)
329  r2(:,1:ncells) = mpas_jedi_zero_kr
330  end where
331 
332  ! calculations
333  r2(:,1:ncells) = r2(:,1:ncells) * mpas_jedi_thousand_kr
334  call q_to_w_ad(ptrr2_a(:,1:ncells), traj_ptrr2_a(:,1:ncells), r2(:,1:ncells))
335 
336  ! cleanup
337  deallocate(r2)
338 
339  case ( var_clw ) !-mass_content_of_cloud_liquid_water_in_atmosphere_layer
340  call q_fields_ad('qc', mfields_ad, gdata%r2, plevels, ncells, nvertlevels)
341 
342  case ( var_cli ) !-mass_content_of_cloud_ice_in_atmosphere_layer
343  call q_fields_ad('qi', mfields_ad, gdata%r2, plevels, ncells, nvertlevels)
344 
345  case ( var_clr ) !-mass_content_of_rain_in_atmosphere_layer
346  call q_fields_ad('qr', mfields_ad, gdata%r2, plevels, ncells, nvertlevels)
347 
348  case ( var_cls ) !-mass_content_of_snow_in_atmosphere_layer
349  call q_fields_ad('qs', mfields_ad, gdata%r2, plevels, ncells, nvertlevels)
350 
351  case ( var_clg ) !-mass_content_of_graupel_in_atmosphere_layer
352  call q_fields_ad('qg', mfields_ad, gdata%r2, plevels, ncells, nvertlevels)
353 
354  case ( var_clh ) !-mass_content_of_hail_in_atmosphere_layer
355  call q_fields_ad('qh', mfields_ad, gdata%r2, plevels, ncells, nvertlevels)
356 
357  end select
358 
359  end if
360 
361  end do !iVar
362 
363  deallocate(plevels)
364 
365 end subroutine multiplyadjoint
366 
367 ! --------------------------------------------------------------------------------------------------
368 
370 ! --------------------------------------------------------------------------------------------------
elemental subroutine, public q_to_w(specific_humidity, mixing_ratio)
subroutine, public pressure_half_to_full(pressure, zgrid, surface_pressure, nC, nV, pressure_f)
subroutine, public q_fields_tl(mqName, modelFields_tl, qGeo_tl, plevels, nCells, nVertLevels)
subroutine, public q_fields_ad(mqName, modelFields_ad, qGeo_ad, plevels, nCells, nVertLevels)
elemental subroutine, public q_to_w_tl(specific_humidity_tl, sh_traj, mixing_ratio_tl)
elemental subroutine, public q_to_w_ad(specific_humidity_ad, sh_traj, mixing_ratio_ad)
elemental subroutine, public tw_to_tv_tl(temperature_tl, mixing_ratio_tl, t_traj, m_traj, virtual_temperature_tl)
elemental subroutine, public tw_to_tv_ad(temperature_ad, mixing_ratio_ad, t_traj, m_traj, virtual_temperature_ad)
character(max_string) message
subroutine, public da_template_pool(geom, templatePool, nf, fieldnames)
Subset a pool from fields described in geom.
real(kind=kind_real), parameter mpas_jedi_thousand_kr
real(kind=kind_real), parameter mpas_jedi_zero_kr
subroutine create(self, geom, bg, fg, conf)
subroutine multiplyadjoint(self, geom, dxg, dxm)
subroutine multiply(self, geom, dxm, dxg)
Fortran derived type to hold MPAS field.
Fortran derived type to hold geometry definition.