MPAS-JEDI
mpas_model_mod.F90
Go to the documentation of this file.
1 ! (C) Copyright 2017 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 fckit_configuration_module, only: fckit_configuration
9 use fckit_log_module, only: fckit_log
10 use iso_c_binding
11 use duration_mod
12 use mpas_geom_mod
15 
16 use mpas_derived_types
17 use mpas_framework
18 use mpas_kind_types
19 use mpas_subdriver
20 use atm_core
21 use mpas_stream_manager
22 use mpas4da_mod
23 use mpas_constants, only : rgas, cp
24 
25 use kinds, only : kind_real
26 
27 implicit none
28 private
29 public :: mpas_model, &
35 
36 ! ------------------------------------------------------------------------------
37 
38 !> Fortran derived type to hold model definition
39 type :: mpas_model
40  ! GD: for now, model is just using the full geom structure
41  ! we update the fields for time integration using subfield
42  ! from mpas_fields
43  type (domain_type), pointer :: domain
44  type (core_type), pointer :: corelist
45  real (kind=kind_real) :: dt
46 end type mpas_model
47 
48 integer, parameter :: max_string=8000
49 character(max_string) :: message
50 
51 #define LISTED_TYPE mpas_model
52 
53 !> Linked list interface - defines registry_t type
54 #include <oops/util/linkedList_i.f>
55 
56 !> Global registry
57 type(registry_t) :: mpas_model_registry
58 
59 ! ------------------------------------------------------------------------------
60 contains
61 ! ------------------------------------------------------------------------------
62 
63 !> Linked list implementation
64 #include <oops/util/linkedList_c.f>
65 
66 ! ------------------------------------------------------------------------------
67 
68 subroutine model_setup(self, geom, f_conf)
69 
70 ! use fckit_mpi_module, only: fckit_mpi_comm
71 
72  implicit none
73  type(fckit_configuration), intent(in) :: f_conf !< fckit config
74  type(mpas_model), intent(inout) :: self ! should I put intent on these?
75 ! type(mpas_model), target :: model ! should I put intent on these?
76  type(mpas_geom) :: geom
77 
78  character(len=:), allocatable :: str
79  character(len=20) :: ststep
80  type(duration) :: dtstep
81 
82  real (kind=kind_real), pointer :: config_dt
83  character (len=StrKIND), pointer :: config_start_time
84  character (len=StrKIND), pointer :: config_restart_timestamp_name
85  character (len=StrKIND), pointer :: config_run_duration
86  character (len=StrKIND), pointer :: config_stop_time
87  character (len=StrKIND) :: starttimestamp
88 
89 ! type(fckit_mpi_comm) :: f_comm
90 
91  call fckit_log%info('===> model_setup')
92 #define ModelMPAS_setup
93 #ifdef ModelMPAS_setup
94  self % corelist => geom % corelist
95  self % domain => geom % domain
96 ! f_comm = fckit_mpi_comm()
97 ! !> MPAS subdriver
98 ! call mpas_init( self % corelist, self % domain, mpi_comm=f_comm%communicator() )
99 ! if (associated(self % domain)) then
100 ! call fckit_log%debug('inside model: model % domain associated')
101 ! end if
102 ! if (associated(self % corelist)) then
103 ! call fckit_log%debug('inside model: model % corelist associated')
104 ! else
105 ! call fckit_log%debug('inside model: model % corelist not associated')
106 ! end if
107 
108  ! GD: we need to update some parameters here regarding the yaml namelist file of oops.
109  ! Also, we can add new DA parameters in the MPAS configs file if needed.
110  call mpas_pool_get_config(self % domain % blocklist % configs, 'config_dt', config_dt)
111  call mpas_pool_get_config(self % domain % blocklist % configs, 'config_start_time', config_start_time)
112  call mpas_pool_get_config(self % domain % blocklist % configs, 'config_restart_timestamp_name', config_restart_timestamp_name)
113  call mpas_pool_get_config(self % domain % blocklist % configs, 'config_run_duration', config_run_duration)
114  call mpas_pool_get_config(self % domain % blocklist % configs, 'config_stop_time', config_stop_time)
115  write(message,*) 'config_dt: ',config_dt
116  call fckit_log%debug(message)
117  write(message,*) 'config_start_time: ',trim(config_start_time)
118  call fckit_log%debug(message)
119  write(message,*) 'config_restart_timestamp_name: ',trim(config_restart_timestamp_name)
120  call fckit_log%debug(message)
121  write(message,*) 'config_run_duration: ',trim(config_run_duration)
122  call fckit_log%debug(message)
123  write(message,*) 'config_stop_time: ',trim(config_stop_time)
124  call fckit_log%debug(message)
125 
126  ! GD: needs a converter from oops yaml file format to mpas if the yaml file drives MPAS
127  ! otherwise mpas namelist file can be used.
128  call f_conf%get_or_die("tstep",str)
129  ststep = str
130  dtstep = trim(ststep)
131  write(message,*) 'ststep: ', ststep
132  call fckit_log%debug(message)
133  self % dt = config_dt !real(duration_seconds(dtstep),kind_real)
134  ! call f_conf%get_or_die("dstep",str)
135  ! dstep = str
136  ! set clock here MPAS_STARTING, MPAS_NOW, MPAS_STOP_TIME
137  ! config_start_time = '2010-10-23_00:00:00'
138  ! config_run_duration = '0_02:00:00'
139 #endif
140 
141 end subroutine model_setup
142 
143 ! ------------------------------------------------------------------------------
144 
145 subroutine model_delete(self)
146 
147  implicit none
148  type(mpas_model) :: self
149 
150  ! For now, all the structure is hold by geom
151  call fckit_log%info('===> model_delete')
152 ! if ((associated(self % corelist)).and.(associated(self % domain))) then
153 ! call fckit_log%debug('===> delete model corelist and domain')
154 ! call mpas_timer_set_context( self % domain )
155 ! call mpas_finalize(self % corelist, self % domain)
156 ! end if
157 
158 end subroutine model_delete
159 
160 ! ------------------------------------------------------------------------------
161 
162 subroutine model_prepare_integration(self, jedi_state)
163 
164  implicit none
165 
166  type(mpas_model) :: self
167  type(mpas_fields) :: jedi_state
168  logical, pointer :: config_do_restart, config_do_dacycling, config_dt
169  integer :: ierr = 0
170  real (kind=kind_real), pointer :: dt
171  type (block_type), pointer :: block
172 
173  character(len=StrKIND) :: starttimestamp, stoptimestamp, nowtimestamp
174 
175  type (mpas_pool_type), pointer :: state
176  type (mpas_pool_type), pointer :: mesh
177  type (mpas_pool_type), pointer :: diag
178  type (field2dreal), pointer :: u_field, pv_edge_field, ru_field, rw_field
179  type (field2dreal), pointer :: ureconstructzonal, ureconstructmeridional
180  character (len=StrKIND), pointer :: xtime
181  character (len=StrKIND), pointer :: config_run_duration
182  type (mpas_time_type) :: starttime, stoptime, nowtime
183  type (mpas_timeinterval_type) :: runduration
184  type (mpas_alarm_type), pointer :: alarmptr
185 
186  call fckit_log%info('===> model_prepare_integration')
187 
188  !--------------------------
189  ! GD: the present design relies on the hypothesis that we run
190  ! the model member sequentially using the geom structure
191  ! In the reverse case, we will need to create locally domain and
192  ! corelist by calling first the mpas_subdriver for example
193  ! like it is done in geom
194  !----------------------------------------------------------------
195 
196  ! here or where increment is computed
197  call da_copy_sub2all_fields(self % domain, jedi_state % subFields)
198 
199 !#ifdef odelMPAS_prepare
200  !-------------------------------------------------------------------
201  ! WIND processing U and V resconstruct to the edges
202  ! not parallel yet, routine initially from DART
203  !-------------------------------------------------------------------
204 
205  ! here or where increment is computed
206  !call mpas_pool_get_field(jedi_state % subfields, 'uReconstructZonal', uReconstructZonal)
207  !call mpas_pool_get_field(jedi_state % subfields, 'uReconstructMeridional', uReconstructMeridional)
208  !call mpas_pool_get_field(state, 'u', u_field, 1)
209  !call uv_cell_to_edges(self%domain, uReconstructZonal, uReconstructMeridional, u_field, &
210  ! & jedi_state%geom%lonCell, jedi_state%geom%latCell, &
211  ! & jedi_state%geom%nCellsGlobal, jedi_state%geom%edgeNormalVectors, &
212  ! & jedi_state%geom%nEdgesOnCell, jedi_state%geom%edgesOnCell, jedi_state%geom%nVertLevels)
213 
214  !-------------------------------------------------------------------
215  ! update domain % clock using mpas_fields clock and config files
216  !-------------------------------------------------------------------
217  starttime = mpas_get_clock_time(jedi_state % clock, mpas_start_time, ierr)
218  call mpas_set_clock_time(self % domain % clock, starttime, mpas_start_time)
219  call mpas_get_time(starttime, datetimestring=starttimestamp) ! needed by xtime later
220  call mpas_pool_get_config(self % domain % blocklist % configs,'config_run_duration',config_run_duration)
221  call mpas_set_timeinterval(runduration, timestring=config_run_duration,ierr=ierr)
222  stoptime = starttime + runduration
223  call mpas_set_clock_time(self % domain % clock, stoptime, mpas_stop_time)
224  call mpas_get_time(stoptime, datetimestring=stoptimestamp)
225  write(message,*) 'MPAS_START_TIME, MPAS_STOP_TIME: ',trim(starttimestamp),trim(stoptimestamp)
226  call fckit_log%debug(message)
227  !--
228  nowtime = mpas_get_clock_time(jedi_state % clock, mpas_now, ierr)
229  call mpas_get_time(nowtime, datetimestring=nowtimestamp)
230  write(message,*) 'MPAS_NOW from jedi_state % clock: ',trim(nowtimestamp)
231  call fckit_log%debug(message)
232  nowtime = mpas_get_clock_time(self % domain % clock, mpas_now, ierr)
233  call mpas_get_time(nowtime, datetimestring=nowtimestamp)
234  write(message,*) 'MPAS_NOW from self % domain % clock: ',trim(nowtimestamp)
235  call fckit_log%debug(message)
236 !-- set xtime as startTimeStamp
237  call mpas_pool_get_array(self % domain % blocklist % allFields, 'xtime', xtime, 1)
238  write(message,*) 'xtime_old=',xtime
239  call fckit_log%debug(message)
240  xtime = starttimestamp
241  write(message,*) 'xtime_new=',xtime
242  call fckit_log%debug(message)
243 
244  !--------------------------------------------------------------------
245  ! Computation of theta_m from theta and qv
246  ! Computation of rho_zz from rho / zz from updated rho
247  ! Recoupling of all the variables
248  !--------------------------------------------------------------------
249  call mpas_pool_get_config(self % domain % blocklist % configs, 'config_do_restart', config_do_restart)
250  call mpas_pool_get_config(self % domain % blocklist % configs, 'config_do_DAcycling', config_do_dacycling)
251  call mpas_pool_get_config(self % domain % blocklist % configs, 'config_dt', dt)
252  config_do_restart = .true.
253  config_do_dacycling = .true.
254 
255 !--- TODO: clean-up this subroutine !!
256 ! call mpas_pool_get_subpool(self % domain % blocklist % structs,'state',state)
257 ! call mpas_pool_get_subpool(self % domain % blocklist % structs, 'diag', diag)
258 ! call mpas_pool_get_subpool(self % domain % blocklist % structs, 'mesh', mesh)
259 ! call atm_compute_output_diagnostics(state, 1, diag, mesh)
260 
261 ! call mpas_pool_get_subpool(self % domain % blocklist % structs, 'state', state)
262 ! call mpas_pool_get_field(state, 'u', u_field, 1)
263 ! call mpas_dmpar_exch_halo_field(u_field)
264 ! call mpas_pool_get_subpool(self % domain % blocklist % structs, 'diag', diag)
265 ! call mpas_pool_get_field(diag, 'rho', u_field, 1)
266 ! call mpas_dmpar_exch_halo_field(u_field)
267 ! call mpas_pool_get_field(diag, 'theta', u_field, 1)
268 ! call mpas_dmpar_exch_halo_field(u_field)
269 
270  block => self % domain % blocklist
271 #define ModelMPAS_prepare
272 #ifdef ModelMPAS_prepare
273  !! Below: "clock" pointer comes from atm_core
274  !! "clock" needs to be associated with self % domain % clock in order to initialize alarms correctly
275  !! in atm_mpas_init_block
276  clock => self % domain % clock
277 
278  !Destroy alarms that were previously initialized (will be re-initialized in atm_mpas_init_block)
279  alarmptr => clock % alarmListHead
280  do while (associated(alarmptr))
281  clock % alarmListHead => alarmptr % next
282  deallocate(alarmptr)
283  alarmptr => clock % alarmListHead
284  end do
285 
286  do while (associated(block))
287  call mpas_pool_get_subpool(block % structs, 'mesh', mesh)
288  call mpas_pool_get_subpool(block % structs, 'state', state)
289 
290  ! GD: if we do cycling in atm_mpas_init_block we propably need to avoid recomputing wind to the
291  ! mass center. (avoiding doing twice ... adding a flag). OK for now, probably same problem with dart
292  call atm_mpas_init_block(self % domain % dminfo, self % domain % streamManager, block, mesh, self % dt)
293  call mpas_pool_get_array(state, 'xtime', xtime, 1)
294  xtime = starttimestamp
295  block => block % next
296  end do
297 
298  call mpas_pool_get_subpool(self % domain % blocklist % structs, 'diag', diag)
299  call mpas_pool_get_field(diag, 'pv_edge', pv_edge_field)
300  call mpas_dmpar_exch_halo_field(pv_edge_field)
301  call mpas_pool_get_field(diag, 'ru', ru_field)
302  call mpas_dmpar_exch_halo_field(ru_field)
303  call mpas_pool_get_field(diag, 'rw', rw_field)
304  call mpas_dmpar_exch_halo_field(rw_field)
305 #endif
306 
307 end subroutine model_prepare_integration
308 
309 ! ------------------------------------------------------------------------------
310 
311 subroutine model_prepare_integration_ad(self, inc)
312 
313  implicit none
314  type(mpas_model) :: self
315  type(mpas_fields) :: inc
316 
317  call fckit_log%info ('===> model_prepare_integration_ad')
318 
319 end subroutine model_prepare_integration_ad
320 
321 ! ------------------------------------------------------------------------------
322 
323 subroutine model_prepare_integration_tl(self, inc)
324 
325  implicit none
326  type(mpas_model) :: self
327  type(mpas_fields) :: inc
328 
329  call fckit_log%info ('===> model_prepare_integration_tl')
330 
331 end subroutine model_prepare_integration_tl
332 
333 ! ------------------------------------------------------------------------------
334 
335 subroutine model_propagate(self, jedi_state)
336 
337  implicit none
338  type(mpas_model) :: self
339  type(mpas_fields) :: jedi_state
340 
341  type (mpas_pool_type), pointer :: state, diag, mesh
342  real (kind=kind_real) :: dt
343  integer :: itimestep
344 
345  call fckit_log%info ('===> model_propagate')
346 
347  ! Get state, diag, and mesh from domain
348  call mpas_pool_get_subpool(self % domain % blocklist % structs, 'state', state)
349  call mpas_pool_get_subpool(self % domain % blocklist % structs, 'diag', diag)
350  call mpas_pool_get_subpool(self % domain % blocklist % structs, 'mesh', mesh)
351 
352  itimestep = 1
353  ! Perform single time step, including
354  ! update of mpas wind from the edges to center
355  call atm_do_timestep(self % domain, self % dt, itimestep)
356  call mpas_pool_shift_time_levels(state)
357  call mpas_advance_clock(self % domain % clock)
358  call mpas_advance_clock(jedi_state % clock) !Advance jedi_state % clock, Too
359 
360  ! TODO: GD: can be here or needs to go probably somewhere else as a postprocessing of a forecast
361  ! update theta et rho: postprocess is implemented at the C++ level now and needs to be
362  ! interfaced with fortran.
363  !if ( mpas_is_clock_time(self % domain % clock) ) then
364  !(1) diagnose theta, rho, pressure
365  call atm_compute_output_diagnostics(state, 1, diag, mesh)
366 
367  !(2) copy all to subFields & diagnose temperature
368  call update_diagnostic_fields(self % domain, jedi_state % subFields, jedi_state % geom % nCellsSolve)
369  !end if
370 
371 end subroutine model_propagate
372 
373 ! ------------------------------------------------------------------------------
374 
375 subroutine model_propagate_ad(self, inc, traj)
376  implicit none
377  type(mpas_model) :: self
378  type(mpas_fields) :: inc
379  type(mpas_trajectory) :: traj
380  call fckit_log%info ('===> model_propagate_ad')
381 end subroutine model_propagate_ad
382 
383 ! ------------------------------------------------------------------------------
384 
385 subroutine model_propagate_tl(self, inc, traj)
386  implicit none
387  type(mpas_model) :: self
388  type(mpas_fields) :: inc
389  type(mpas_trajectory) :: traj
390  call fckit_log%info ('===> model_propagate_tl')
391 end subroutine model_propagate_tl
392 
393 ! ------------------------------------------------------------------------------
394 
395 subroutine model_prop_traj(self, jedi_state, traj)
396 
397  implicit none
398  type(mpas_model) :: self
399  type(mpas_fields) :: jedi_state
400  type(mpas_trajectory) :: traj
401 
402  call fckit_log%info ('===> model_prop_traj in mpas_model_mod.F90')
403  call set_traj(traj,jedi_state)
404 
405 end subroutine model_prop_traj
406 
407 ! ------------------------------------------------------------------------------
408 
409 subroutine model_wipe_traj(traj)
410 
411  implicit none
412  type(mpas_trajectory) :: traj
413 
414  call fckit_log%info ('===> model_wipe_traj')
415 
416 end subroutine model_wipe_traj
417 
418 ! ------------------------------------------------------------------------------
419 
420 end module mpas_model_mod
character(len=1024) message
Definition: mpas4da_mod.F90:67
subroutine, public da_copy_sub2all_fields(domain, pool_a)
Performs a copy of a sub pool A to allfields.
integer, parameter max_string
subroutine, public update_diagnostic_fields(domain, subFields, ngrid)
subroutine, public model_delete(self)
type(registry_t), public mpas_model_registry
Linked list interface - defines registry_t type.
subroutine, public model_propagate(self, jedi_state)
subroutine, public model_prop_traj(self, jedi_state, traj)
subroutine, public model_setup(self, geom, f_conf)
Linked list implementation.
subroutine, public model_prepare_integration_ad(self, inc)
subroutine, public model_propagate_tl(self, inc, traj)
subroutine, public model_prepare_integration_tl(self, inc)
subroutine, public model_prepare_integration(self, jedi_state)
subroutine, public model_wipe_traj(traj)
subroutine, public model_propagate_ad(self, inc, traj)
subroutine, public set_traj(self, state)
Linked list implementation.
Fortran derived type to hold MPAS field.
Fortran derived type to hold geometry definition.
Fortran derived type to hold model definition.
Fortran derived type to hold the model trajectory.