FMS 2025.01.02-dev
Flexible Modeling System
Loading...
Searching...
No Matches
data_override.inc
1!***********************************************************************
2!* GNU Lesser General Public License
3!*
4!* This file is part of the GFDL Flexible Modeling System (FMS).
5!*
6!* FMS is free software: you can redistribute it and/or modify it under
7!* the terms of the GNU Lesser General Public License as published by
8!* the Free Software Foundation, either version 3 of the License, or (at
9!* your option) any later version.
10!*
11!* FMS is distributed in the hope that it will be useful, but WITHOUT
12!* ANY WARRANTY; without even the implied warranty of MERCHANTABILITY or
13!* FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License
14!* for more details.
15!*
16!* You should have received a copy of the GNU Lesser General Public
17!* License along with FMS. If not, see <http://www.gnu.org/licenses/>.
18!***********************************************************************
19
20! This file contains the body of the data_override_r4 and data_override_r8
21! modules. These modules are not intended to be used directly - they should be
22! used through the data_override_mod API. See data_override.F90 for details.
23
24use platform_mod, only: r4_kind, r8_kind, fms_path_len, fms_file_len
25use yaml_parser_mod
26use constants_mod, only: deg_to_rad
27use mpp_mod, only : mpp_error, fatal, warning, note, stdout, stdlog, mpp_max
28use mpp_mod, only : input_nml_file
29use horiz_interp_mod, only : horiz_interp_init, horiz_interp_new, horiz_interp_type, &
31use time_interp_external2_mod, only: time_interp_external_init, &
36 set_override_region, &
38 no_region, inside_region, outside_region, &
39 get_external_fileobj
40use fms_mod, only: write_version_number, lowercase, check_nml_error
41use axis_utils2_mod, only : nearest_index, axis_edges
42use mpp_domains_mod, only : domain2d, mpp_get_compute_domain, null_domain2d,operator(.NE.),operator(.EQ.)
43use mpp_domains_mod, only : mpp_get_global_domain, mpp_get_data_domain
44use mpp_domains_mod, only : domainug, mpp_pass_sg_to_ug, mpp_get_ug_sg_domain, null_domainug
45use time_manager_mod, only: time_type, OPERATOR(>), OPERATOR(<)
46use fms2_io_mod, only : fmsnetcdffile_t, open_file, close_file, &
47 read_data, fms2_io_init, variable_exists, &
48 get_mosaic_tile_file, file_exists, get_instance_filename
49use get_grid_version_mod, only: get_grid_version_1, get_grid_version_2
50use fms_string_utils_mod, only: string
51
52implicit none
53private
54
55! Include variable "version" to be written to log file.
56#include<file_version.h>
57
58!> Private type for holding field and grid information from a data table
59!> @ingroup data_override_mod
60type data_type
61 character(len=3) :: gridname
62 character(len=128) :: fieldname_code !< fieldname used in user's code (model)
63 character(len=128) :: fieldname_file !< fieldname used in the netcdf data file
64 character(len=FMS_PATH_LEN) :: file_name !< name of netCDF data file
65 character(len=128) :: interpol_method !< interpolation method (default "bilinear")
66 logical :: ext_weights
67 character(len=128) :: ext_weights_file_name
68 character(len=128) :: ext_weights_source
69 real(FMS_DATA_OVERRIDE_KIND_) :: factor !< For unit conversion, default=1, see OVERVIEW above
70 real(FMS_DATA_OVERRIDE_KIND_) :: lon_start, lon_end, lat_start, lat_end
71 integer :: region_type
72 logical :: multifile = .false.
73 character(len=FMS_PATH_LEN) :: prev_file_name !< name of netCDF data file for previous segment
74 character(len=FMS_PATH_LEN) :: next_file_name !< name of netCDF data file for next segment
75 type(time_type), dimension(:), allocatable :: time_records
76 type(time_type), dimension(:), allocatable :: time_prev_records
77 type(time_type), dimension(:), allocatable :: time_next_records
78end type data_type
79
80!> Private type for holding various data fields for performing data overrides
81!> @ingroup data_override_mod
82type override_type
83 character(len=3) :: gridname
84 character(len=128) :: fieldname
85 integer :: t_index !< index for time interp
86 integer :: pt_index !< previous index for time interp
87 integer :: nt_index !< next index for time interp
88 type(horiz_interp_type), allocatable :: horz_interp(:) !< index for horizontal spatial interp
89 integer :: dims(4) !< dimensions(x,y,z,t) of the field in filename
90 integer :: comp_domain(4) !< istart,iend,jstart,jend for compute domain
91 integer :: numthreads
92 real(FMS_DATA_OVERRIDE_KIND_), allocatable :: lon_in(:)
93 real(FMS_DATA_OVERRIDE_KIND_), allocatable :: lat_in(:)
94 logical, allocatable :: need_compute(:)
95 integer :: numwindows
96 integer :: window_size(2)
97 integer :: is_src, ie_src, js_src, je_src
98end type override_type
99
100!> Private type for holding horiz_interp_type for a weight file
101!! This is needed so that if variables use the same weight file,
102!! then we won't have to read the weight file again
103!> @ingroup data_override_mod
104type fmsexternalweights_type
105 character(len=:), allocatable :: weight_filename !< Name of the weight file
106 type(horiz_interp_type) :: horiz_interp !< Horiz interp type read in from the weight file
107end type fmsexternalweights_type
108
109integer, parameter :: lkind = fms_data_override_kind_
110integer, parameter :: max_table=100, max_array=100
111
112integer :: table_size !< actual size of data table
113integer :: nweight_files !< Number of weight files that have been used
114type(fmsExternalWeights_type), allocatable, target :: external_weights(:) !< External weights types
115logical :: module_is_initialized = .false.
116
117type(domain2D) :: ocn_domain,atm_domain,lnd_domain, ice_domain
118type(domainUG) :: lnd_domainUG
119
120real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:), target, allocatable :: lon_local_ocn, lat_local_ocn
121real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:), target, allocatable :: lon_local_atm, lat_local_atm
122real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:), target, allocatable :: lon_local_ice, lat_local_ice
123real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:), target, allocatable :: lon_local_lnd, lat_local_lnd
124real(FMS_DATA_OVERRIDE_KIND_) :: min_glo_lon_ocn, max_glo_lon_ocn
125real(FMS_DATA_OVERRIDE_KIND_) :: min_glo_lon_atm, max_glo_lon_atm
126real(FMS_DATA_OVERRIDE_KIND_) :: min_glo_lon_lnd, max_glo_lon_lnd
127real(FMS_DATA_OVERRIDE_KIND_) :: min_glo_lon_ice, max_glo_lon_ice
128integer :: num_fields = 0 !< number of fields in override_array already processed
129
130type(data_type), dimension(:), allocatable :: data_table !< user-provided data table
131
132type(data_type) :: default_table
133type(override_type), dimension(max_array) :: override_array !< to store processed fields
134type(override_type) :: default_array
135logical :: debug_data_override
136logical :: grid_center_bug = .false.
137logical :: reproduce_null_char_bug = .false. !> Flag indicating
138 !! to reproduce the mpp_io bug where lat/lon_bnd were
139 !! not read correctly if null characters are present in
140 !! the netcdf file
141logical :: use_center_grid_points=.false. !< Flag indicating
142 !! whether or not to use the centroid values of the
143 !! supergrid from the grid file as opposed to calculating it
144 !! by taking the average of the four corner points.
145 !! This is only relevant to OCN and ICE grids.
146logical :: use_data_table_yaml = .false.
147
148namelist /data_override_nml/ debug_data_override, grid_center_bug, reproduce_null_char_bug, use_data_table_yaml, &
149 use_center_grid_points
150
151public :: data_override_init_impl_, data_override_unset_atm_, data_override_unset_ocn_, &
152 & data_override_unset_lnd_, data_override_unset_ice_, data_override_0d_, &
153 & data_override_2d_, data_override_3d_, data_override_ug_1d_, &
154 & data_override_ug_2d_
155
156contains
157
158!> @brief Assign default values for default_table, get domain of component models,
159!! get global grids of component models.
160!! Users should call data_override_init before calling data_override
161!!
162!! This subroutine should be called by data_override_init.
163!!
164!! Data_table is initialized here with default values. Users should provide "real" values
165!! that will override the default values. Real values can be specified in either data_table
166!! or data_table.yaml. Each line of data_table contains one data_entry. Items of data_entry
167!! are comma-separated.
168subroutine data_override_init_impl_(Atm_domain_in, Ocean_domain_in, Ice_domain_in, Land_domain_in, Land_domainUG_in)
169 type (domain2d), intent(in), optional :: Atm_domain_in !> Atmosphere domain
170 type (domain2d), intent(in), optional :: Ocean_domain_in !> Ocean domain
171 type (domain2d), intent(in), optional :: Ice_domain_in !> Ice domain
172 type (domain2d), intent(in), optional :: Land_domain_in !> Land domain
173 type(domainUG) , intent(in), optional :: Land_domainUG_in !> Land domain, unstructured grid
174
175 character(len=18), parameter :: grid_file = 'INPUT/grid_spec.nc'
176 integer :: is,ie,js,je,use_get_grid_version
177 integer :: i, iunit, io_status, ierr
178 logical :: atm_on, ocn_on, lnd_on, ice_on, lndUG_on
179 logical :: file_open
180 type(FmsNetcdfFile_t) :: fileobj
181
182 debug_data_override = .false.
183
184 read (input_nml_file, data_override_nml, iostat=io_status)
185 ierr = check_nml_error(io_status, 'data_override_nml')
186 iunit = stdlog()
187 write(iunit, data_override_nml)
188
189! grid_center_bug is no longer supported.
190if (grid_center_bug) then
191 call mpp_error(fatal, "data_override_init: You have overridden the default value of " // &
192 "grid_center_bug and set it to .true. in data_override_nml. This was a temporary workaround " // &
193 "that is no longer supported. Please remove this namelist variable.")
194endif
195
196if (use_data_table_yaml) then
197 call mpp_error(note, "You are using YAML.")
198else
199 call mpp_error(note, "You are using the legacy table.")
200end if
201
202 atm_on = PRESENT(atm_domain_in)
203 ocn_on = PRESENT(ocean_domain_in)
204 lnd_on = PRESENT(land_domain_in)
205 ice_on = PRESENT(ice_domain_in)
206 lndug_on = PRESENT(land_domainug_in)
207 if(.not. module_is_initialized) then
208 atm_domain = null_domain2d
209 ocn_domain = null_domain2d
210 lnd_domain = null_domain2d
211 ice_domain = null_domain2d
212 lnd_domainug = null_domainug
213 end if
214 if (atm_on) atm_domain = atm_domain_in
215 if (ocn_on) ocn_domain = ocean_domain_in
216 if (lnd_on) lnd_domain = land_domain_in
217 if (ice_on) ice_domain = ice_domain_in
218 if (lndug_on) lnd_domainug = land_domainug_in
219
220 if(.not. module_is_initialized) then
222 call write_version_number("DATA_OVERRIDE_MOD", version)
223
224! Initialize user-provided data table
225 default_table%gridname = 'non'
226 default_table%fieldname_code = 'none'
227 default_table%fieldname_file = 'none'
228 default_table%file_name = 'none'
229 default_table%factor = 1._lkind
230 default_table%interpol_method = 'bilinear'
231 default_table%multifile = .false.
232 default_table%prev_file_name = ''
233 default_table%next_file_name = ''
234
235#ifdef use_yaml
236 if (use_data_table_yaml) then
237 if (file_exists("data_table")) &
238 call mpp_error(fatal, "You cannot have the legacy data_table if use_data_table_yaml=.true.")
239 call read_table_yaml(data_table)
240 allocate(external_weights(table_size))
241 nweight_files = 0
242 else
243 if (file_exists("data_table.yaml"))&
244 call mpp_error(fatal, "You cannot have the yaml data_table if use_data_table_yaml=.false.")
245 allocate(data_table(max_table))
246 do i = 1, max_table
247 data_table(i) = default_table
248 enddo
249 call read_table(data_table)
250 end if
251#else
252 if (file_exists("data_table.yaml"))&
253 call mpp_error(fatal, "You cannot have the yaml data_table if use_data_table_yaml=.false.")
254
255 if (use_data_table_yaml) then
256 call mpp_error(fatal, "You cannot have use_data_table_yaml=.true. without compiling with -Duse_yaml")
257 else
258
259 allocate(data_table(max_table))
260 do i = 1, max_table
261 data_table(i) = default_table
262 enddo
263 call read_table(data_table)
264 end if
265#endif
266
267! Initialize override array
268 default_array%gridname = 'NONE'
269 default_array%fieldname = 'NONE'
270 default_array%t_index = -1
271 default_array%dims = -1
272 default_array%comp_domain = -1
273 do i = 1, max_array
274 override_array(i) = default_array
275 enddo
277 end if
278
279 module_is_initialized = .true.
280
281 if ( .NOT. (atm_on .or. ocn_on .or. lnd_on .or. ice_on .or. lndug_on)) return
282 if (table_size .eq. 0) then
283 call mpp_error(note, "data_table is empty, not doing any data_overrides")
284 return
285 endif
286 call fms2_io_init
287
288! Test if grid_file is already opened
289 inquire (file=trim(grid_file), opened=file_open)
290 if(file_open) call mpp_error(fatal, trim(grid_file)//' already opened')
291
292 if(.not. open_file(fileobj, grid_file, 'read' )) then
293 call mpp_error(fatal, 'data_override_mod: Error in opening file '//trim(grid_file))
294 endif
295
296 if(variable_exists(fileobj, "x_T" ) .OR. variable_exists(fileobj, "geolon_t" ) ) then
297 use_get_grid_version = 1
298 call close_file(fileobj)
299 else if(variable_exists(fileobj, "ocn_mosaic_file" ) .OR. variable_exists(fileobj, "gridfiles" ) ) then
300 use_get_grid_version = 2
301 if(variable_exists(fileobj, "gridfiles" ) ) then
302 if(count_ne_1((ocn_on .OR. ice_on), lnd_on, atm_on)) call mpp_error(fatal, 'data_override_mod: the grid file ' //&
303 'is a solo mosaic, one and only one of atm_on, lnd_on or ice_on/ocn_on should be true')
304 end if
305 else
306 call mpp_error(fatal, 'data_override_mod: none of x_T, geolon_t, ocn_mosaic_file or gridfiles exist in '// &
307 & trim(grid_file))
308 endif
309
310 if(use_get_grid_version .EQ. 1) then
311 if (atm_on .and. .not. allocated(lon_local_atm) ) then
312 call mpp_get_compute_domain( atm_domain,is,ie,js,je)
313 allocate(lon_local_atm(is:ie,js:je), lat_local_atm(is:ie,js:je))
314 call get_grid_version_1(grid_file, 'atm', atm_domain, is, ie, js, je, lon_local_atm, lat_local_atm, &
315 min_glo_lon_atm, max_glo_lon_atm )
316 endif
317 if (ocn_on .and. .not. allocated(lon_local_ocn) ) then
318 call mpp_get_compute_domain( ocn_domain,is,ie,js,je)
319 allocate(lon_local_ocn(is:ie,js:je), lat_local_ocn(is:ie,js:je))
320 call get_grid_version_1(grid_file, 'ocn', ocn_domain, is, ie, js, je, lon_local_ocn, lat_local_ocn, &
321 min_glo_lon_ocn, max_glo_lon_ocn )
322 endif
323
324 if (lnd_on .and. .not. allocated(lon_local_lnd) ) then
325 call mpp_get_compute_domain( lnd_domain,is,ie,js,je)
326 allocate(lon_local_lnd(is:ie,js:je), lat_local_lnd(is:ie,js:je))
327 call get_grid_version_1(grid_file, 'lnd', lnd_domain, is, ie, js, je, lon_local_lnd, lat_local_lnd, &
328 min_glo_lon_lnd, max_glo_lon_lnd )
329 endif
330
331 if (ice_on .and. .not. allocated(lon_local_ice) ) then
332 call mpp_get_compute_domain( ice_domain,is,ie,js,je)
333 allocate(lon_local_ice(is:ie,js:je), lat_local_ice(is:ie,js:je))
334 call get_grid_version_1(grid_file, 'ice', ice_domain, is, ie, js, je, lon_local_ice, lat_local_ice, &
335 min_glo_lon_ice, max_glo_lon_ice )
336 endif
337 else
338 if (atm_on .and. .not. allocated(lon_local_atm) ) then
339 call mpp_get_compute_domain(atm_domain,is,ie,js,je)
340 allocate(lon_local_atm(is:ie,js:je), lat_local_atm(is:ie,js:je))
341 call get_grid_version_2(fileobj, 'atm', atm_domain, is, ie, js, je, lon_local_atm, lat_local_atm, &
342 min_glo_lon_atm, max_glo_lon_atm )
343 endif
344
345 if (ocn_on .and. .not. allocated(lon_local_ocn) ) then
346 call mpp_get_compute_domain( ocn_domain,is,ie,js,je)
347 allocate(lon_local_ocn(is:ie,js:je), lat_local_ocn(is:ie,js:je))
348 call get_grid_version_2(fileobj, 'ocn', ocn_domain, is, ie, js, je, lon_local_ocn, lat_local_ocn, &
349 min_glo_lon_ocn, max_glo_lon_ocn, use_center_grid_points)
350 endif
351
352 if (lnd_on .and. .not. allocated(lon_local_lnd) ) then
353 call mpp_get_compute_domain( lnd_domain,is,ie,js,je)
354 allocate(lon_local_lnd(is:ie,js:je), lat_local_lnd(is:ie,js:je))
355 call get_grid_version_2(fileobj, 'lnd', lnd_domain, is, ie, js, je, lon_local_lnd, lat_local_lnd, &
356 min_glo_lon_lnd, max_glo_lon_lnd )
357 endif
358
359 if (ice_on .and. .not. allocated(lon_local_ice) ) then
360 call mpp_get_compute_domain( ice_domain,is,ie,js,je)
361 allocate(lon_local_ice(is:ie,js:je), lat_local_ice(is:ie,js:je))
362 call get_grid_version_2(fileobj, 'ocn', ice_domain, is, ie, js, je, lon_local_ice, lat_local_ice, &
363 min_glo_lon_ice, max_glo_lon_ice, use_center_grid_points )
364 endif
365 end if
366 if(use_get_grid_version .EQ. 2) then
367 call close_file(fileobj)
368 end if
369end subroutine data_override_init_impl_
370!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
371!> @brief Implementation of the following truth table:
372!!
373!! Arg 1 Arg 2 Arg 3 | Result !!
374!!
375!! .true. .true. .true. | .true. !!
376!! .true. .true. .false. | .true. !!
377!! .true. .false. .true. | .true. !!
378!! .true. .false. .false. | .false. !!
379!! .false. .true. .true. | .true. !!
380!! .false. .true. .false. | .false. !!
381!! .false. .false. .true. | .false. !!
382!! .false. .false. .false. | .true. !!
383function count_ne_1(in_1, in_2, in_3)
384 logical, intent(in) :: in_1 !< Argument 1
385 logical, intent(in) :: in_2 !< Argument 2
386 logical, intent(in) :: in_3 !< Argument 3
387 logical :: count_ne_1
388
389 count_ne_1 = .not.(in_1.NEQV.in_2.NEQV.in_3) .OR. (in_1.AND.in_2.AND.in_3)
390end function count_ne_1
391
392subroutine read_table(data_table)
393 type(data_type), dimension(max_table), intent(inout) :: data_table
394
395 integer :: ntable
396 integer :: ntable_lima
397 integer :: ntable_new
398
399 integer :: iunit
400 integer :: io_status
401 integer :: index_1col, index_2col
402 character(len=256) :: record
403 type(data_type) :: data_entry
404
405 logical :: ongrid
406 logical :: table_exists !< Flag indicating existence of data_table
407 character(len=128) :: region, region_type
408
409 integer :: sunit
410
411! Read coupler_table
412 inquire(file='data_table', exist=table_exists)
413 if (.not. table_exists) then
414 call mpp_error(note, 'data_override_mod: File data_table does not exist.')
415 table_size = 0
416 return
417 end if
418
419 open(newunit=iunit, file='data_table', action='READ', iostat=io_status)
420 if(io_status/=0) call mpp_error(fatal, 'data_override_mod: Error in opening file data_table.')
421
422 ntable = 0
423 ntable_lima = 0
424 ntable_new = 0
425
426 do while (ntable <= max_table)
427 read(iunit,'(a)',end=100) record
428 if (record(1:1) == '#') cycle
429 if (record(1:10) == ' ') cycle
430 ntable=ntable+1
431 if(index(lowercase(record), "inside_region") .ne. 0 .or. index(lowercase(record), "outside_region") .ne. 0) then
432 if(index(lowercase(record), ".false.") .ne. 0 .or. index(lowercase(record), ".true.") .ne. 0 ) then
433 ntable_lima = ntable_lima + 1
434 read(record,*,err=99) data_entry%gridname, data_entry%fieldname_code, data_entry%fieldname_file, &
435 data_entry%file_name, ongrid, data_entry%factor, region, region_type
436 if(ongrid) then
437 data_entry%interpol_method = 'none'
438 else
439 data_entry%interpol_method = 'bilinear'
440 endif
441 else
442 ntable_new=ntable_new+1
443 read(record,*,err=99) data_entry%gridname, data_entry%fieldname_code, data_entry%fieldname_file, &
444 data_entry%file_name, data_entry%interpol_method, data_entry%factor, region, &
445 & region_type
446
447 if (index(data_entry%file_name, ":") .ne. 0) then
448 data_entry%multifile = .true.
449 index_1col = index(data_entry%file_name, ":")
450 index_2col = index(data_entry%file_name(index_1col+1:), ":")
451 if (index_2col .eq. 0) call mpp_error(fatal, "data_override: when bridging over forcing files, " &
452 // "central forcing files must be preceded AND followed by the column (:) separator")
453 data_entry%prev_file_name = data_entry%file_name(1:index_1col-1)
454 data_entry%next_file_name = data_entry%file_name(index_1col+index_2col+1:)
455 ! once previous/next files are filled in, overwrite current
456 data_entry%file_name = data_entry%file_name(index_1col+1:index_1col+index_2col-1)
457 else
458 data_entry%multifile = .false.
459 data_entry%prev_file_name = ""
460 data_entry%next_file_name = ""
461 endif
462 if (data_entry%interpol_method == 'default') then
463 data_entry%interpol_method = default_table%interpol_method
464 endif
465 if (.not.(data_entry%interpol_method == 'default' .or. &
466 data_entry%interpol_method == 'bicubic' .or. &
467 data_entry%interpol_method == 'bilinear' .or. &
468 data_entry%interpol_method == 'none')) then
469 sunit = stdout()
470 write(sunit,*)" gridname is ", trim(data_entry%gridname)
471 write(sunit,*)" fieldname_code is ", trim(data_entry%fieldname_code)
472 write(sunit,*)" fieldname_file is ", trim(data_entry%fieldname_file)
473 write(sunit,*)" file_name is ", trim(data_entry%file_name)
474 write(sunit,*)" factor is ", data_entry%factor
475 write(sunit,*)" interpol_method is ", trim(data_entry%interpol_method)
476 call mpp_error(fatal, 'data_override_mod: invalid last entry in data_override_table, ' &
477 //'its value should be "default", "bicubic", "bilinear" or "none" ')
478 endif
479 endif
480 if( trim(region_type) == "inside_region" ) then
481 data_entry%region_type = inside_region
482 else if( trim(region_type) == "outside_region" ) then
483 data_entry%region_type = outside_region
484 else
485 call mpp_error(fatal, 'data_override_mod: region type should be inside_region or outside_region')
486 endif
487 if (data_entry%file_name == "") call mpp_error(fatal, &
488 "data_override: filename not given in data_table when region_type is not NO_REGION")
489 if(data_entry%fieldname_file == "") call mpp_error(fatal, &
490 "data_override: fieldname_file must be specified in data_table when region_type is not NO_REGION")
491 if( trim(data_entry%interpol_method) == 'none') call mpp_error(fatal, &
492 "data_override(data_override_init): ongrid must be false when region_type is not NO_REGION")
493 read(region,*) data_entry%lon_start, data_entry%lon_end, data_entry%lat_start, data_entry%lat_end
494 !--- make sure data_entry%lon_end > data_entry%lon_start and data_entry%lat_end > data_entry%lat_start
495 if(data_entry%lon_end .LE. data_entry%lon_start) call mpp_error(fatal, &
496 "data_override: lon_end should be greater than lon_start")
497 if(data_entry%lat_end .LE. data_entry%lat_start) call mpp_error(fatal, &
498 "data_override: lat_end should be greater than lat_start")
499 ! old format
500 else if (index(lowercase(record), ".false.") .ne. 0 .or. index(lowercase(record), ".true.") .ne. 0 ) then
501 ntable_lima = ntable_lima + 1
502 read(record,*,err=99) data_entry%gridname, data_entry%fieldname_code, data_entry%fieldname_file, &
503 data_entry%file_name, ongrid, data_entry%factor
504 if (index(data_entry%file_name, ":") .ne. 0) then
505 data_entry%multifile = .true.
506 index_1col = index(data_entry%file_name, ":")
507 index_2col = index(data_entry%file_name(index_1col+1:), ":")
508 if (index_2col .eq. 0) call mpp_error(fatal, "data_override: when bridging over forcing files, " &
509 // "central forcing files must be preceded AND followed by the column (:) separator")
510 data_entry%prev_file_name = data_entry%file_name(1:index_1col-1)
511 data_entry%next_file_name = data_entry%file_name(index_1col+index_2col+1:)
512 ! once previous/next files are filled in, overwrite current
513 data_entry%file_name = data_entry%file_name(index_1col+1:index_1col+index_2col-1)
514 else
515 data_entry%multifile = .false.
516 data_entry%prev_file_name = ""
517 data_entry%next_file_name = ""
518 endif
519 if(ongrid) then
520 data_entry%interpol_method = 'none'
521 else
522 data_entry%interpol_method = 'bilinear'
523 endif
524 data_entry%lon_start = 0.0_lkind
525 data_entry%lon_end = -1.0_lkind
526 data_entry%lat_start = 0.0_lkind
527 data_entry%lat_end = -1.0_lkind
528 data_entry%region_type = no_region
529 else ! new format
530 ntable_new=ntable_new+1
531 read(record,*,err=99) data_entry%gridname, data_entry%fieldname_code, data_entry%fieldname_file, &
532 data_entry%file_name, data_entry%interpol_method, data_entry%factor
533 if (index(data_entry%file_name, ":") .ne. 0) then
534 index_1col = index(data_entry%file_name, ":")
535 index_2col = index(data_entry%file_name(index_1col+1:), ":")
536 data_entry%multifile = .true.
537 if (index_2col .eq. 0) call mpp_error(fatal, "data_override: when bridging over forcing files, " &
538 // "central forcing files must be preceded AND followed by the column (:) separator")
539 data_entry%prev_file_name = data_entry%file_name(1:index_1col-1)
540 data_entry%next_file_name = data_entry%file_name(index_1col+index_2col+1:)
541 ! once previous/next files are filled in, overwrite current
542 data_entry%file_name = data_entry%file_name(index_1col+1:index_1col+index_2col-1)
543 else
544 data_entry%multifile = .false.
545 data_entry%prev_file_name = ""
546 data_entry%next_file_name = ""
547 endif
548 if (data_entry%interpol_method == 'default') then
549 data_entry%interpol_method = default_table%interpol_method
550 endif
551 if (.not.(data_entry%interpol_method == 'default' .or. &
552 data_entry%interpol_method == 'bicubic' .or. &
553 data_entry%interpol_method == 'bilinear' .or. &
554 data_entry%interpol_method == 'none')) then
555 sunit = stdout()
556 write(sunit,*)" gridname is ", trim(data_entry%gridname)
557 write(sunit,*)" fieldname_code is ", trim(data_entry%fieldname_code)
558 write(sunit,*)" fieldname_file is ", trim(data_entry%fieldname_file)
559 write(sunit,*)" file_name is ", trim(data_entry%file_name)
560 write(sunit,*)" factor is ", data_entry%factor
561 write(sunit,*)" interpol_method is ", trim(data_entry%interpol_method)
562 call mpp_error(fatal, 'data_override_mod: invalid last entry in data_override_table, ' &
563 //'its value should be "default", "bicubic", "bilinear" or "none" ')
564 endif
565 data_entry%lon_start = 0.0_lkind
566 data_entry%lon_end = -1.0_lkind
567 data_entry%lat_start = 0.0_lkind
568 data_entry%lat_end = -1.0_lkind
569 data_entry%region_type = no_region
570 endif
571 data_entry%ext_weights = .false.
572 data_table(ntable) = data_entry
573 enddo
574 call mpp_error(fatal,'too many enries in data_table')
57599 call mpp_error(fatal,'error in data_table format')
576100 continue
577 table_size = ntable
578 if(ntable_new*ntable_lima /= 0) call mpp_error(fatal, &
579 'data_override_mod: New and old formats together in same data_table not supported')
580 close(iunit, iostat=io_status)
581 if(io_status/=0) call mpp_error(fatal, 'data_override_mod: Error in closing file data_table')
582end subroutine read_table
583
584#ifdef use_yaml
585!> @brief Read and parse the data_table.yaml
586subroutine read_table_yaml(data_table)
587 type(data_type), dimension(:), allocatable, intent(out) :: data_table !< Contents of the data_table.yaml
588
589 integer, allocatable :: entry_id(:)
590 integer :: sub_block_id(1), sub2_block_id(1)
591 integer :: nentries, mentries
592 integer :: i
593 character(len=50) :: buffer
594 character(len=FMS_FILE_LEN) :: filename !< Name of the expected data_table.yaml
595 integer :: file_id
596
597 ! If doing and ensemble or nest run add the filename appendix (ens_XX or nest_XX) to the filename
598 call get_instance_filename("data_table.yaml", filename)
599 if (index(trim(filename), "ens_") .ne. 0) then
600 if (file_exists(filename) .and. file_exists("data_table.yaml")) &
601 call mpp_error(fatal, "Both data_table.yaml and "//trim(filename)//" exists, pick one!")
602
603 !< If the end_* file does not exist, revert back to "data_table.yaml"
604 !! where every ensemble is using the same yaml
605 if (.not. file_exists(filename)) filename = "data_table.yaml"
606 endif
607
608 file_id = open_and_parse_file(trim(filename))
609
610 if (file_id==999) then
611 nentries = 0
612 else
613 nentries = get_num_blocks(file_id, "data_table")
614 allocate(data_table(nentries))
615 allocate(entry_id(nentries))
616 call get_block_ids(file_id, "data_table", entry_id)
617
618 do i = 1, nentries
619 call get_value_from_key(file_id, entry_id(i), "factor", data_table(i)%factor)
620 call get_value_from_key(file_id, entry_id(i), "grid_name", data_table(i)%gridname)
621 call check_for_valid_gridname(data_table(i)%gridname)
622 call get_value_from_key(file_id, entry_id(i), "fieldname_in_model", data_table(i)%fieldname_code)
623
624 mentries = get_num_blocks(file_id, "override_file", parent_block_id=entry_id(i))
625 data_table(i)%file_name = ""
626 data_table(i)%fieldname_file = ""
627 data_table(i)%interpol_method = "none"
628 data_table(i)%multifile = .false.
629 data_table(i)%ext_weights = .false.
630 data_table(i)%region_type = no_region
631 data_table(i)%prev_file_name = ""
632 data_table(i)%next_file_name = ""
633 data_table(i)%ext_weights_file_name = ""
634 data_table(i)%ext_weights_source = ""
635
636 ! If there is no override_file block, then not overriding from file, so move on to the next entry
637 if (mentries .eq. 0) cycle
638
639 if(mentries.gt.1) call mpp_error(fatal, "Too many override_file blocks in data table. "//&
640 "Check your data_table.yaml entry for field:"//trim(data_table(i)%gridname)//":"//&
641 trim(data_table(i)%fieldname_code))
642 call get_block_ids(file_id, "override_file", sub_block_id, parent_block_id=entry_id(i))
643
644 call get_value_from_key(file_id, sub_block_id(1), "file_name", data_table(i)%file_name)
645 call get_value_from_key(file_id, sub_block_id(1), "fieldname_in_file", data_table(i)%fieldname_file)
646 call get_value_from_key(file_id, sub_block_id(1), "interp_method", data_table(i)%interpol_method)
647 call check_interpol_method(data_table(i)%interpol_method, data_table(i)%file_name, &
648 & data_table(i)%fieldname_file)
649
650 mentries = get_num_blocks(file_id, "multi_file", parent_block_id=sub_block_id(1))
651 if(mentries.gt.1) call mpp_error(fatal, "Too many multi_file blocks in tata table. "//&
652 "Check your data_table.yaml entry for field:"//trim(data_table(i)%gridname)//":"//&
653 trim(data_table(i)%fieldname_code))
654
655 if(mentries.gt.0) data_table(i)%multifile = .true.
656
657 if (data_table(i)%multifile) then
658 call get_block_ids(file_id, "multi_file", sub2_block_id, parent_block_id=sub_block_id(1))
659 call get_value_from_key(file_id, sub2_block_id(1), "prev_file_name", data_table(i)%prev_file_name)
660 call get_value_from_key(file_id, sub2_block_id(1), "next_file_name", data_table(i)%next_file_name)
661 if (trim(data_table(i)%prev_file_name) .eq. "" .and. trim(data_table(i)%next_file_name) .eq. "") &
662 call mpp_error(fatal, "The prev_file_name and next_file_name must be present if is_multi_file. "//&
663 "Check your data_table.yaml entry for field:"//trim(data_table(i)%gridname)//":"//&
664 trim(data_table(i)%fieldname_code))
665 endif
666
667 mentries = get_num_blocks(file_id, "external_weights", parent_block_id=sub_block_id(1))
668 if(mentries.gt.1) call mpp_error(fatal, "Too many external_weight blocks in data table. "//&
669 "Check your data_table.yaml entry for field:"//trim(data_table(i)%gridname)//":"//&
670 trim(data_table(i)%fieldname_code))
671
672 if(mentries.gt.0) data_table(i)%ext_weights = .true.
673
674 if (data_table(i)%ext_weights) then
675 call get_block_ids(file_id, "external_weights", sub2_block_id, parent_block_id=sub_block_id(1))
676 call get_value_from_key(file_id, sub2_block_id(1), "file_name", data_table(i)%ext_weights_file_name)
677 call get_value_from_key(file_id, sub2_block_id(1), "source", data_table(i)%ext_weights_source)
678 if (trim(data_table(i)%ext_weights_file_name) .eq. "" .and. trim(data_table(i)%ext_weights_source) .eq. "") &
679 call mpp_error(fatal, "The file_name and source must be present when using external weights"//&
680 "Check your data_table.yaml entry for field:"//trim(data_table(i)%gridname)//":"//&
681 trim(data_table(i)%fieldname_code))
682 endif
683
684 mentries = get_num_blocks(file_id, "subregion", parent_block_id=entry_id(i))
685 if(mentries.gt.1) call mpp_error(fatal, "Too many subregion blocks in data table. "//&
686 "Check your data_table.yaml entry for field:"//trim(data_table(i)%gridname)//":"//&
687 trim(data_table(i)%fieldname_code))
688
689 buffer = ""
690 if(mentries.gt.0) then
691 call get_block_ids(file_id, "subregion", sub_block_id, parent_block_id=entry_id(i))
692 call get_value_from_key(file_id, sub_block_id(1), "type", buffer)
693 endif
694
695 call check_and_set_region_type(buffer, data_table(i)%region_type)
696 if (data_table(i)%region_type .ne. no_region) then
697 call get_value_from_key(file_id, sub_block_id(1), "lon_start", data_table(i)%lon_start)
698 call get_value_from_key(file_id, sub_block_id(1), "lon_end", data_table(i)%lon_end)
699 call get_value_from_key(file_id, sub_block_id(1), "lat_start", data_table(i)%lat_start)
700 call get_value_from_key(file_id, sub_block_id(1), "lat_end", data_table(i)%lat_end)
701 call check_valid_lat_lon(data_table(i)%lon_start, data_table(i)%lon_end, &
702 data_table(i)%lat_start, data_table(i)%lat_end)
703 endif
704 end do
705
706 end if
707 table_size = nentries !< Because one variable is not enough
708end subroutine read_table_yaml
709
710!> @brief Check if a grid name is valid, crashes if it is not
711subroutine check_for_valid_gridname(gridname)
712 character(len=*), intent(in) :: gridname !< Gridname
713
714 select case(trim(gridname))
715 case ("OCN", "ATM", "LND", "ICE")
716 case default
717 call mpp_error(fatal, trim(gridname)//" is not a valid gridname. "//&
718 "The acceptable values are OCN ATM LND and ICE. Check your data_table.yaml")
719 end select
720end subroutine check_for_valid_gridname
721
722!> @brief Check if the interpol method is correct, crashes if it is not
723subroutine check_interpol_method(interp_method, filename, fieldname)
724 character(len=*), intent(in) :: interp_method !< The interpo_method
725 character(len=*), intent(in) :: filename !< The filename
726 character(len=*), intent(in) :: fieldname !< The fieldname in the file
727
728 select case(trim(interp_method))
729 case ("bicubic", "bilinear")
730 if (trim(filename) .eq. "" .or. trim(fieldname) .eq. "") call mpp_error(fatal, &
731 "The file_name and the fieldname_file must be set if using the bicubic or bilinear interpolation method."//&
732 " Check your data_table.yaml")
733 case ("none")
734 if (trim(filename) .ne. "" ) then
735 if (trim(fieldname) .eq. "") call mpp_error(fatal, &
736 "If the interpol_method is none and file_name is specified (ongrid case), "//&
737 "you must also specify the fieldname_file")
738 endif
739 case default
740 call mpp_error(fatal, trim(interp_method)//" is not a valid interp method. "//&
741 "The acceptable values are bilinear and bicubic")
742 end select
743end subroutine check_interpol_method
744
745!> @brief Check if a region_type is valid, crashes if it is not. Otherwise it sets the
746!! correct integer parameter.
747subroutine check_and_set_region_type(region_type_str, region_type_int)
748 character(len=*), intent(in) :: region_type_str !< The region type as defined in the data.yaml
749 integer, intent(out) :: region_type_int !< The region type as an integer parameter
750
751 select case(trim(region_type_str))
752 case ("inside_region")
753 region_type_int = inside_region
754 case ("outside_region")
755 region_type_int = outside_region
756 case ("")
757 region_type_int = no_region
758 case default
759 call mpp_error(fatal, trim(region_type_str)//" is not a valid region type. "//&
760 "The acceptable values are inside_region and outside_regioon. Check your data_table.yaml")
761 end select
762end subroutine check_and_set_region_type
763
764!> @brief Check if a region lon_start, lon_end, lat_start and lat_end is valid.
765!! Crashes if it is not.
766subroutine check_valid_lat_lon(lon_start, lon_end, lat_start, lat_end)
767 real(FMS_DATA_OVERRIDE_KIND_), intent(in) :: lon_start !< Starting longitude of the data_override region
768 real(FMS_DATA_OVERRIDE_KIND_), intent(in) :: lon_end !< Ending longitude of the data_override region
769 real(FMS_DATA_OVERRIDE_KIND_), intent(in) :: lat_start !< Starting lattiude of the data_override region
770 real(FMS_DATA_OVERRIDE_KIND_), intent(in) :: lat_end !< Ending lattiude of the data_override region
771
772 if (lon_start > lon_end) call mpp_error(fatal, &
773 "lon_start:"//string(lon_start)//" is greater than lon_end"//string(lon_end)//&
774 ". Check your data_table.yaml.")
775
776 if (lat_start > lat_end) call mpp_error(fatal, &
777 "lat_start:"//string(lat_start)//" is greater than lat_end:"//string(lat_end)//&
778 ". Check your data_table.yaml.")
779end subroutine check_valid_lat_lon
780#endif
781
782subroutine data_override_unset_atm_
783 atm_domain = null_domain2d
784 if (allocated(lon_local_atm)) deallocate(lon_local_atm)
785 if (allocated(lat_local_atm)) deallocate(lat_local_atm)
786end subroutine
787
788subroutine data_override_unset_ocn_
789 ocn_domain = null_domain2d
790 if (allocated(lon_local_ocn)) deallocate(lon_local_ocn)
791 if (allocated(lat_local_ocn)) deallocate(lat_local_ocn)
792end subroutine
793
794subroutine data_override_unset_lnd_
795 lnd_domain = null_domain2d
796 if (allocated(lon_local_lnd)) deallocate(lon_local_lnd)
797 if (allocated(lat_local_lnd)) deallocate(lat_local_lnd)
798end subroutine
799
800subroutine data_override_unset_ice_
801 ice_domain = null_domain2d
802 if (allocated(lon_local_ice)) deallocate(lon_local_ice)
803 if (allocated(lat_local_ice)) deallocate(lat_local_ice)
804end subroutine
805
806!> @brief Given a gridname, this routine returns the working domain associated with this gridname
807subroutine get_domain(gridname, domain, comp_domain)
808 character(len=3), intent(in) :: gridname
809 type(domain2D), intent(inout) :: domain
810 integer, intent(out), optional :: comp_domain(4) !< istart,iend,jstart,jend for compute domain
811
812 domain = null_domain2d
813 select case (gridname)
814 case('OCN')
815 domain = ocn_domain
816 case('ATM')
817 domain = atm_domain
818 case('LND')
819 domain = lnd_domain
820 case('ICE')
821 domain = ice_domain
822 case default
823 call mpp_error(fatal,'error in data_override get_domain')
824 end select
825 if(domain .EQ. null_domain2d) call mpp_error(fatal,'data_override: failure in get_domain')
826 if(present(comp_domain)) &
827 call mpp_get_compute_domain(domain,comp_domain(1),comp_domain(2),comp_domain(3),comp_domain(4))
828end subroutine get_domain
829
830!> @brief Given a gridname, this routine returns the working domain associated with this gridname
831subroutine get_domainug(gridname, UGdomain, comp_domain)
832 character(len=3), intent(in) :: gridname
833 type(domainUG), intent(inout) :: UGdomain
834 integer, intent(out), optional :: comp_domain(4) !< istart,iend,jstart,jend for compute domain
835 type(domain2D), pointer :: SGdomain => null()
836
837 ugdomain = null_domainug
838 select case (gridname)
839 case('LND')
840 ugdomain = lnd_domainug
841 case default
842 call mpp_error(fatal,'error in data_override get_domain')
843 end select
844! if(UGdomain .EQ. NULL_DOMAINUG) call mpp_error(FATAL,'data_override: failure in get_domain')
845 if(present(comp_domain)) &
846 call mpp_get_ug_sg_domain(ugdomain,sgdomain)
847 call mpp_get_compute_domain(sgdomain,comp_domain(1),comp_domain(2),comp_domain(3),comp_domain(4))
848end subroutine get_domainug
849!===============================================================================================
850
851!> @brief Routine to perform data override for scalar fields
852subroutine data_override_0d_(gridname,fieldname_code,data_out,time,override,data_index)
853 character(len=3), intent(in) :: gridname !< model grid ID (ocn,ice,atm,lnd)
854 character(len=*), intent(in) :: fieldname_code !< field name as used in the model (may be
855 !! different from the name in NetCDF data file)
856 logical, intent(out), optional :: override !< true if the field has been overriden succesfully
857 type(time_type), intent(in) :: time !< (target) model time
858 real(FMS_DATA_OVERRIDE_KIND_), intent(out) :: data_out !< output data array returned by this call
859 integer, intent(in), optional :: data_index
860
861 type(time_type) :: first_record !< first record of "current" file
862 type(time_type) :: last_record !< last record of "current" file
863 character(len=FMS_PATH_LEN) :: filename !< file containing source data
864 character(len=FMS_PATH_LEN) :: prevfilename !< file containing previous source data, when using multiple files
865 character(len=FMS_PATH_LEN) :: nextfilename !< file containing next source data, when using multiple files
866 character(len=128) :: fieldname !< fieldname used in the data file
867 integer :: index1 !< field index in data_table
868 integer :: dims(4)
869 integer :: prev_dims(4) !< dimensions of previous source data, when using multiple files
870 integer :: next_dims(4) !< dimensions of next source data, when using multiple files
871 integer :: id_time !< index for time interp in override array
872 integer :: id_time_prev=-1 !< time index for previous file, when using multiple files
873 integer :: id_time_next=-1 !< time index for next file, when using multiple files
874 integer :: curr_position !< position of the field currently processed in override_array
875 integer :: i
876 real(FMS_DATA_OVERRIDE_KIND_) :: factor
877 logical :: multifile !< use multiple consecutive files for override
878
879 if(.not.module_is_initialized) &
880 call mpp_error(fatal,'Error: need to call data_override_init first')
881
882!1 Look for the data file in data_table
883 if(PRESENT(override)) override = .false.
884 if (present(data_index)) then
885 index1 = data_index
886 else
887 index1 = -1
888 do i = 1, table_size
889 if( trim(gridname) /= trim(data_table(i)%gridname)) cycle
890 if( trim(fieldname_code) /= trim(data_table(i)%fieldname_code)) cycle
891 index1 = i ! field found
892 exit
893 enddo
894 if(index1 .eq. -1) then
895 if(debug_data_override) &
896 call mpp_error(warning,'this field is NOT found in data_table: '//trim(fieldname_code))
897 return ! NO override was performed
898 endif
899 endif
900
901 fieldname = data_table(index1)%fieldname_file ! fieldname in netCDF data file
902 factor = data_table(index1)%factor
903 multifile = data_table(index1)%multifile
904
905 if(fieldname == "") then
906 data_out = factor
907 if(PRESENT(override)) override = .true.
908 return
909 else
910 filename = data_table(index1)%file_name
911 if (filename == "") call mpp_error(fatal,'data_override: filename not given in data_table')
912 if (multifile) prevfilename = data_table(index1)%prev_file_name
913 if (multifile) nextfilename = data_table(index1)%next_file_name
914 endif
915
916!3 Check if fieldname has been previously processed
917!$OMP SINGLE
918 curr_position = -1
919 if(num_fields > 0 ) then
920 do i = 1, num_fields
921 if(trim(override_array(i)%gridname) /= trim(gridname)) cycle
922 if(trim(override_array(i)%fieldname) /= trim(fieldname_code)) cycle
923 curr_position = i
924 exit
925 enddo
926 endif
927
928 if(curr_position < 0) then ! the field has not been processed previously
929 num_fields = num_fields + 1
930 curr_position = num_fields
931 ! record fieldname, gridname in override_array
932 override_array(curr_position)%fieldname = fieldname_code
933 override_array(curr_position)%gridname = gridname
934 id_time = init_external_field(filename,fieldname,verbose=debug_data_override)
935 if(id_time<0) call mpp_error(fatal,'data_override:field not found in init_external_field 1')
936 override_array(curr_position)%t_index = id_time
937 else !curr_position >0
938 !9 Get id_time previously stored in override_array
939 id_time = override_array(curr_position)%t_index
940 endif !if curr_position < 0
941
942
943 ! if using consecutive files for data_override, get time axis for previous and next files
944 ! and check spatial dims for consistency
945 if_multi1: if (multifile) then
946 id_time_prev = -1
947 if_prev1: if (trim(prevfilename) /= '') then
948 id_time_prev = init_external_field(prevfilename,fieldname,verbose=debug_data_override)
949 dims = get_external_field_size(id_time)
950 prev_dims = get_external_field_size(id_time_prev)
951 ! check consistency of spatial dims
952 if ((prev_dims(1) .ne. dims(1)) .or. (prev_dims(2) .ne. dims(2)) .or. &
953 (prev_dims(3) .ne. dims(3))) then
954 call mpp_error(fatal, 'data_override: dimensions mismatch between consecutive forcing files')
955 endif
956 allocate(data_table(index1)%time_prev_records(prev_dims(4)))
957 call get_time_axis(id_time_prev,data_table(index1)%time_prev_records)
958 endif if_prev1
959 id_time_next = -1
960 if_next1: if (trim(nextfilename) /= '') then
961 id_time_next = init_external_field(nextfilename,fieldname,verbose=debug_data_override)
962 dims = get_external_field_size(id_time)
963 next_dims = get_external_field_size(id_time_next)
964 ! check consistency of spatial dims
965 if ((next_dims(1) .ne. dims(1)) .or. (next_dims(2) .ne. dims(2)) .or. &
966 (next_dims(3) .ne. dims(3))) then
967 call mpp_error(fatal, 'data_override: dimensions mismatch between consecutive forcing files')
968 endif
969 allocate(data_table(index1)%time_next_records(next_dims(4)))
970 call get_time_axis(id_time_next,data_table(index1)%time_next_records)
971 endif if_next1
972 endif if_multi1
973
974
975 !10 do time interp to get data in compute_domain
976
977 ! if using consecutive files, allow to perform time interpolation between the last record of previous
978 ! file and first record of current file OR between the last record of current file and first record of
979 ! next file hence "bridging" over files.
980 if_multi2: if (multifile) then
981 dims = get_external_field_size(id_time)
982 if (.not. allocated(data_table(index1)%time_records)) allocate(data_table(index1)%time_records(dims(4)))
983 call get_time_axis(id_time,data_table(index1)%time_records)
984
985 first_record = data_table(index1)%time_records(1)
986 last_record = data_table(index1)%time_records(dims(4))
987
988 if_time2: if (time<first_record) then
989 if (id_time_prev<0) call mpp_error(fatal,'data_override:previous file needed with multifile')
990 prev_dims = get_external_field_size(id_time_prev)
991 if (time<data_table(index1)%time_prev_records(prev_dims(4))) call mpp_error(fatal, &
992 'data_override: time_interp_external_bridge should only be called to bridge with previous file')
993 call time_interp_external_bridge(id_time_prev, id_time,time,data_out,verbose=debug_data_override)
994 elseif (time>last_record) then
995 if (id_time_next<0) call mpp_error(fatal,'data_override:next file needed with multifile')
996 if (time>data_table(index1)%time_next_records(1)) call mpp_error(fatal, &
997 'data_override: time_interp_external_bridge should only be called to bridge with next file')
998 call time_interp_external_bridge(id_time, id_time_next,time,data_out,verbose=debug_data_override)
999 else ! first_record < time < last_record, do not use bridge
1000 call time_interp_external(id_time,time,data_out,verbose=debug_data_override)
1001 endif if_time2
1002 else ! standard behavior
1003 call time_interp_external(id_time,time,data_out,verbose=debug_data_override)
1004 endif if_multi2
1005
1006
1007 data_out = data_out*factor
1008!$OMP END SINGLE
1009
1010 if(PRESENT(override)) override = .true.
1011
1012end subroutine data_override_0d_
1013
1014!> @brief This routine performs data override for 2D fields.
1015subroutine data_override_2d_(gridname,fieldname,data_2D,time,override, is_in, ie_in, js_in, je_in)
1016 character(len=3), intent(in) :: gridname !< model grid ID
1017 character(len=*), intent(in) :: fieldname !< field to override
1018 logical, intent(out), optional :: override !< true if the field has been overriden succesfully
1019 type(time_type), intent(in) :: time !< model time
1020 real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:), intent(inout) :: data_2D !< data returned by this call
1021 integer, optional, intent(in) :: is_in, ie_in, js_in, je_in
1022 real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:,:), allocatable :: data_3D
1023 integer :: index1
1024 integer :: i
1025
1026!1 Look for the data file in data_table
1027 if(PRESENT(override)) override = .false.
1028 index1 = -1
1029 do i = 1, table_size
1030 if( trim(gridname) /= trim(data_table(i)%gridname)) cycle
1031 if( trim(fieldname) /= trim(data_table(i)%fieldname_code)) cycle
1032 index1 = i ! field found
1033 exit
1034 enddo
1035 if(index1 .eq. -1) return ! NO override was performed
1036
1037 allocate(data_3d(size(data_2d,1),size(data_2d,2),1))
1038 data_3d(:,:,1) = data_2d
1039 call data_override_3d_(gridname,fieldname,data_3d,time,override,data_index=index1,&
1040 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in)
1041
1042 data_2d(:,:) = data_3d(:,:,1)
1043 deallocate(data_3d)
1044end subroutine data_override_2d_
1045
1046!> @brief This routine performs data override for 3D fields
1047subroutine data_override_3d_(gridname,fieldname_code,return_data,time,override,data_index, is_in, ie_in, js_in, je_in)
1048 character(len=3), intent(in) :: gridname !< model grid ID
1049 character(len=*), intent(in) :: fieldname_code !< field name as used in the model
1050 logical, optional, intent(out) :: override !< true if the field has been overriden succesfully
1051 type(time_type), intent(in) :: time !< (target) model time
1052 integer, optional, intent(in) :: data_index
1053 real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:,:), intent(inout) :: return_data !< data returned by this call
1054 integer, optional, intent(in) :: is_in, ie_in, js_in, je_in
1055 logical, dimension(:,:,:), allocatable :: mask_out
1056
1057 character(len=FMS_PATH_LEN) :: filename !< file containing source data
1058 character(len=FMS_PATH_LEN) :: filename2 !< file containing source data
1059 character(len=FMS_PATH_LEN) :: prevfilename !< file containing source data for previous file
1060 character(len=FMS_PATH_LEN) :: prevfilename2 !< file containing source data for previous file
1061 character(len=FMS_PATH_LEN) :: nextfilename !< file containing source data for next file
1062 character(len=FMS_PATH_LEN) :: nextfilename2 !< file containing source data for next file
1063 character(len=128) :: fieldname !< fieldname used in the data file
1064 integer :: i,j
1065 integer :: dims(4)
1066 integer :: prev_dims(4) !< dimensions of previous source data, when using multiple files
1067 integer :: next_dims(4) !< dimensions of next source data, when using multiple files
1068 integer :: index1 !< field index in data_table
1069 integer :: id_time !< index for time interp in override array
1070 integer :: id_time_prev=-1 !< time index for previous file, when using multiple files
1071 integer :: id_time_next=-1 !< time index for next file, when using multiple files
1072 integer :: axis_sizes(4)
1073 character(len=32) :: axis_names(4)
1074 real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:), pointer :: lon_local =>null() !< of output (target) grid cells
1075 real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:), pointer :: lat_local =>null() !< of output (target) grid cells
1076 real(FMS_DATA_OVERRIDE_KIND_), dimension(:), allocatable :: lon_tmp, lat_tmp
1077
1078 logical :: data_file_is_2D = .false. !< data in netCDF file is 2D
1079 logical :: ongrid, use_comp_domain
1080 type(domain2D) :: domain
1081 type(time_type) :: first_record !< first record of "current" file
1082 type(time_type) :: last_record !< last record of "current" file
1083 integer :: curr_position !< position of the field currently processed in override_array
1084 real(FMS_DATA_OVERRIDE_KIND_) :: factor
1085 integer, dimension(4) :: comp_domain = 0 !< istart,iend,jstart,jend for compute domain
1086 integer :: nxd, nyd, nxc, nyc, nwindows
1087 integer :: nwindows_x, ipos, jpos, window_size(2)
1088 integer :: istart, iend, jstart, jend
1089 integer :: isw, iew, jsw, jew
1090 integer :: omp_get_num_threads, window_id
1091 logical :: need_compute
1092 real(FMS_DATA_OVERRIDE_KIND_) :: lat_min, lat_max
1093 integer :: is_src, ie_src, js_src, je_src
1094 logical :: exists
1095 logical :: multifile !< use multiple consecutive files for override
1096 type(FmsNetcdfFile_t) :: fileobj
1097 integer :: startingi !< Starting x index for the compute domain relative to the input buffer
1098 integer :: endingi !< Ending x index for the compute domain relative to the input buffer
1099 integer :: startingj !< Starting y index for the compute domain relative to the input buffer
1100 integer :: endingj !< Ending y index for the compute domain relative to the input buffer
1101 integer :: nhalox !< Number of halos in the x direction
1102 integer :: nhaloy !< Number of halos in the y direction
1103 logical :: found_weight_file !< .True. if the weight file has already been read
1104 integer :: nglat !< Number of latitudes in the global domain
1105 integer :: nglon !< Number of longitudes in the global domain
1106
1107 use_comp_domain = .false.
1108 if(.not.module_is_initialized) &
1109 call mpp_error(fatal,'Error: need to call data_override_init first')
1110
1111!1 Look for the data file in data_table
1112 if(PRESENT(override)) override = .false.
1113 if (present(data_index)) then
1114 index1 = data_index
1115 else
1116 index1 = -1
1117 do i = 1, table_size
1118 if( trim(gridname) /= trim(data_table(i)%gridname)) cycle
1119 if( trim(fieldname_code) /= trim(data_table(i)%fieldname_code)) cycle
1120 index1 = i ! field found
1121 exit
1122 enddo
1123 if(index1 .eq. -1) then
1124 if(debug_data_override) &
1125 call mpp_error(warning,'this field is NOT found in data_table: '//trim(fieldname_code))
1126 return ! NO override was performed
1127 endif
1128 endif
1129
1130 fieldname = data_table(index1)%fieldname_file ! fieldname in netCDF data file
1131 factor = data_table(index1)%factor
1132 multifile = data_table(index1)%multifile
1133
1134 if(fieldname == "") then
1135 return_data = factor
1136 if(PRESENT(override)) override = .true.
1137 return
1138 else
1139 filename = data_table(index1)%file_name
1140 if (filename == "") call mpp_error(fatal,'data_override: filename not given in data_table')
1141 if (multifile) prevfilename = data_table(index1)%prev_file_name
1142 if (multifile) nextfilename = data_table(index1)%next_file_name
1143 endif
1144
1145 ongrid = (data_table(index1)%interpol_method == 'none')
1146
1147!3 Check if fieldname has been previously processed
1148!$OMP CRITICAL
1149 curr_position = -1
1150 if(num_fields > 0 ) then
1151 do i = 1, num_fields
1152 if(trim(override_array(i)%gridname) /= trim(gridname)) cycle
1153 if(trim(override_array(i)%fieldname) /= trim(fieldname_code)) cycle
1154 curr_position = i
1155 exit
1156 enddo
1157 endif
1158
1159 if(curr_position < 0) then ! the field has not been processed previously
1160 num_fields = num_fields + 1
1161 curr_position = num_fields
1162
1163! Get working domain from model's gridname
1164 call get_domain(gridname,domain,comp_domain)
1165 call mpp_get_data_domain(domain, xsize=nxd, ysize=nyd)
1166 nxc = comp_domain(2)-comp_domain(1) + 1
1167 nyc = comp_domain(4)-comp_domain(3) + 1
1168
1169! record fieldname, gridname in override_array
1170 override_array(curr_position)%fieldname = fieldname_code
1171 override_array(curr_position)%gridname = gridname
1172 override_array(curr_position)%comp_domain = comp_domain
1173! get number of threads
1174 override_array(curr_position)%numthreads = 1
1175#if defined(_OPENMP)
1176 override_array(curr_position)%numthreads = omp_get_num_threads()
1177#endif
1178!--- data_override may be called from physics windows. The following are possible situations
1179!--- 1. size(return_data,1) == nxd and size(return_data,2) == nyd
1180!--- (on return_data domain and there is only one window).
1181!--- 2. nxc is divisible by size(return_data,1), nyc is divisible by size(return_data,2),
1182!--- nwindow = (nxc/size(return_data(1))*(nyc/size(return_data,2)),
1183!--- also we require nwindows is divisible by nthreads.
1184!--- The another restrition is that size(return_data,1) == ie_in - is_in + 1,
1185!--- size(return_data,2) == je_in - js_in + 1
1186 nwindows = 1
1187 if( nxd == size(return_data,1) .AND. nyd == size(return_data,2) ) then !
1188 use_comp_domain = .false.
1189 else if ( mod(nxc, size(return_data,1)) ==0 .AND. mod(nyc, size(return_data,2)) ==0 ) then
1190 use_comp_domain = .true.
1191 nwindows = (nxc/size(return_data,1))*(nyc/size(return_data,2))
1192 else
1193 call mpp_error(fatal, &
1194 & "data_override: data is not on data domain and compute domain is not divisible by size(data)")
1195 endif
1196 override_array(curr_position)%window_size(1) = size(return_data,1)
1197 override_array(curr_position)%window_size(2) = size(return_data,2)
1198
1199 window_size = override_array(curr_position)%window_size
1200 override_array(curr_position)%numwindows = nwindows
1201 if( mod(nwindows, override_array(curr_position)%numthreads) .NE. 0 ) then
1202 call mpp_error(fatal, "data_override: nwindow is not divisible by nthreads")
1203 endif
1204 allocate(override_array(curr_position)%need_compute(nwindows))
1205 override_array(curr_position)%need_compute = .true.
1206
1207!4 get index for time interp
1208 if(ongrid) then
1209 if( data_table(index1)%region_type .NE. no_region ) then
1210 call mpp_error(fatal,.NE.'data_override: ongrid must be false when region_type NO_REGION')
1211 endif
1212
1213! Allow on-grid data_overrides on cubed sphere grid
1214 inquire(file=trim(filename),exist=exists)
1215 if (.not. exists) then
1216 call get_mosaic_tile_file(filename,filename2,.false.,domain)
1217 filename = filename2
1218 endif
1219
1220 ! if using consecutive files for data_override, get file names
1221 if_multi3: if (multifile) then
1222 if_prev3: if (trim(prevfilename) /= '') then
1223 inquire(file=trim(prevfilename),exist=exists)
1224 if (.not. exists) then
1225 call get_mosaic_tile_file(prevfilename,prevfilename2,.false.,domain)
1226 prevfilename = prevfilename2
1227 endif
1228 endif if_prev3
1229 if_next3: if (trim(nextfilename) /= '') then
1230 inquire(file=trim(nextfilename),exist=exists)
1231 if (.not. exists) then
1232 call get_mosaic_tile_file(nextfilename,nextfilename2,.false.,domain)
1233 nextfilename = nextfilename2
1234 endif
1235 endif if_next3
1236 endif if_multi3
1237
1238 !--- we always only pass data on compute domain
1239 id_time = init_external_field(filename,fieldname,domain=domain,verbose=debug_data_override, &
1240 use_comp_domain=use_comp_domain, nwindows=nwindows, ongrid=ongrid)
1241
1242 ! if using consecutive files for data_override, get time axis for previous and next files
1243 ! and check spatial dims for consistency
1244 if_multi4: if (multifile) then
1245 id_time_prev = -1
1246 if_prev4:if (trim(prevfilename) /= '') then
1247 id_time_prev = init_external_field(prevfilename,fieldname,domain=domain, &
1248 verbose=debug_data_override,use_comp_domain=use_comp_domain, &
1249 nwindows = nwindows, ongrid=ongrid)
1250 dims = get_external_field_size(id_time)
1251 prev_dims = get_external_field_size(id_time_prev)
1252 ! check consistency of spatial dims
1253 if ((prev_dims(1) .ne. dims(1)) .or. (prev_dims(2) .ne. dims(2)) .or. &
1254 (prev_dims(3) .ne. dims(3))) then
1255 call mpp_error(fatal, 'data_override: dimensions mismatch between consecutive forcing files')
1256 endif
1257 allocate(data_table(index1)%time_prev_records(prev_dims(4)))
1258 call get_time_axis(id_time_prev,data_table(index1)%time_prev_records)
1259 endif if_prev4
1260 id_time_next = -1
1261 if_next4: if (trim(nextfilename) /= '') then
1262 id_time_next = init_external_field(nextfilename,fieldname,domain=domain, &
1263 verbose=debug_data_override,use_comp_domain=use_comp_domain, &
1264 nwindows = nwindows, ongrid=ongrid)
1265 dims = get_external_field_size(id_time)
1266 next_dims = get_external_field_size(id_time_next)
1267 ! check consistency of spatial dims
1268 if ((next_dims(1) .ne. dims(1)) .or. (next_dims(2) .ne. dims(2)) .or. &
1269 (next_dims(3) .ne. dims(3))) then
1270 call mpp_error(fatal, 'data_override: dimensions mismatch between consecutive forcing files')
1271 endif
1272 allocate(data_table(index1)%time_next_records(next_dims(4)))
1273 call get_time_axis(id_time_next,data_table(index1)%time_next_records)
1274 endif if_next4
1275 endif if_multi4
1276
1277 dims = get_external_field_size(id_time)
1278 override_array(curr_position)%dims = dims
1279 if(id_time<0) call mpp_error(fatal,'data_override:field not found in init_external_field 1')
1280 override_array(curr_position)%t_index = id_time
1281 override_array(curr_position)%pt_index = id_time_prev
1282 override_array(curr_position)%nt_index = id_time_next
1283 else !ongrid=false
1284 id_time = init_external_field(filename,fieldname,domain=domain, axis_names=axis_names,&
1285 axis_sizes=axis_sizes, verbose=debug_data_override,override=.true.,use_comp_domain=use_comp_domain, &
1286 nwindows = nwindows)
1287
1288 ! if using consecutive files for data_override, get time axis for previous and next files
1289 ! and check spatial dims for consistency
1290 if_multi5: if (multifile) then
1291 id_time_prev = -1
1292 if_prev5: if (trim(prevfilename) /= '') then
1293 id_time_prev = init_external_field(prevfilename,fieldname,domain=domain, axis_names=axis_names,&
1294 axis_sizes=axis_sizes, verbose=debug_data_override,override=.true.,use_comp_domain=use_comp_domain, &
1295 nwindows = nwindows)
1296 prev_dims = get_external_field_size(id_time_prev)
1297 allocate(data_table(index1)%time_prev_records(prev_dims(4)))
1298 call get_time_axis(id_time_prev,data_table(index1)%time_prev_records)
1299 endif if_prev5
1300 id_time_next = -1
1301 if_next5: if (trim(nextfilename) /= '') then
1302 id_time_next = init_external_field(nextfilename,fieldname,domain=domain, axis_names=axis_names,&
1303 axis_sizes=axis_sizes, verbose=debug_data_override,override=.true.,use_comp_domain=use_comp_domain, &
1304 nwindows = nwindows)
1305 next_dims = get_external_field_size(id_time_next)
1306 allocate(data_table(index1)%time_next_records(next_dims(4)))
1307 call get_time_axis(id_time_next,data_table(index1)%time_next_records)
1308 endif if_next5
1309 endif if_multi5
1310
1311 dims = get_external_field_size(id_time)
1312 override_array(curr_position)%dims = dims
1313 if(id_time<0) call mpp_error(fatal,'data_override:field not found in init_external_field 2')
1314 override_array(curr_position)%t_index = id_time
1315 override_array(curr_position)%pt_index = id_time_prev
1316 override_array(curr_position)%nt_index = id_time_next
1317
1318 ! get lon and lat of the input (source) grid, assuming that axis%data contains
1319 ! lat and lon of the input grid (in degrees)
1320
1321 allocate(override_array(curr_position)%horz_interp(nwindows))
1322 allocate(override_array(curr_position)%lon_in(axis_sizes(1)+1))
1323 allocate(override_array(curr_position)%lat_in(axis_sizes(2)+1))
1324 if(get_external_fileobj(filename, fileobj)) then
1325 call axis_edges(fileobj, axis_names(1), override_array(curr_position)%lon_in, &
1326 reproduce_null_char_bug_flag=reproduce_null_char_bug)
1327 call axis_edges(fileobj, axis_names(2), override_array(curr_position)%lat_in, &
1328 reproduce_null_char_bug_flag=reproduce_null_char_bug)
1329 else
1330 call mpp_error(fatal,'data_override: file '//trim(filename)//' is not opened in time_interp_external')
1331 end if
1332! convert lon_in and lat_in from deg to radian
1333 override_array(curr_position)%lon_in = override_array(curr_position)%lon_in * real(deg_to_rad, lkind)
1334 override_array(curr_position)%lat_in = override_array(curr_position)%lat_in * real(deg_to_rad, lkind)
1335
1336 !--- find the region of the source grid that cover the local model grid.
1337 !--- currently we only find the index range for j-direction because
1338 !--- of the cyclic condition in i-direction. The purpose of this is to
1339 !--- decrease the memory usage and increase the IO performance.
1340 select case(gridname)
1341 case('OCN')
1342 lon_local => lon_local_ocn; lat_local => lat_local_ocn
1343 case('ICE')
1344 lon_local => lon_local_ice; lat_local => lat_local_ice
1345 case('ATM')
1346 lon_local => lon_local_atm; lat_local => lat_local_atm
1347 case('LND')
1348 lon_local => lon_local_lnd; lat_local => lat_local_lnd
1349 case default
1350 call mpp_error(fatal,'error: gridname not recognized in data_override')
1351 end select
1352
1353 lat_min = minval(lat_local)
1354 lat_max = maxval(lat_local)
1355 is_src = 1
1356 ie_src = axis_sizes(1)
1357 js_src = 1
1358 je_src = axis_sizes(2)
1359 ! do j = 1, axis_sizes(2)+1
1360 ! if( override_array(curr_position)%lat_in(j) > lat_min ) exit
1361 ! js_src = j
1362 ! enddo
1363 ! do j = 1, axis_sizes(2)+1
1364 ! je_src = j
1365 ! if( override_array(curr_position)%lat_in(j) > lat_max ) exit
1366 ! enddo
1367
1368 !--- bicubic interpolation need one extra point in each direction. Also add
1369 !--- one more point for because lat_in is in the corner but the interpolation
1370 !--- use center points.
1371 select case (data_table(index1)%interpol_method)
1372 case ('bilinear')
1373 js_src = max(1, js_src-1)
1374 je_src = min(axis_sizes(2), je_src+1)
1375 case ('bicubic')
1376 js_src = max(1, js_src-2)
1377 je_src = min(axis_sizes(2), je_src+2)
1378 end select
1379 override_array(curr_position)%is_src = is_src
1380 override_array(curr_position)%ie_src = ie_src
1381 override_array(curr_position)%js_src = js_src
1382 override_array(curr_position)%je_src = je_src
1383 call reset_src_data_region(id_time, is_src, ie_src, js_src, je_src)
1384 if (multifile) then
1385 if (trim(prevfilename) /= '') then
1386 call reset_src_data_region(id_time_prev, is_src, ie_src, js_src, je_src)
1387 endif
1388 if (trim(nextfilename) /= '') then
1389 call reset_src_data_region(id_time_next, is_src, ie_src, js_src, je_src)
1390 endif
1391 endif
1392
1393! Find the index of lon_start, lon_end, lat_start and lat_end in the input grid (nearest points)
1394 if( data_table(index1)%region_type .NE. no_region ) then
1395 allocate( lon_tmp(axis_sizes(1)), lat_tmp(axis_sizes(2)) )
1396 call read_data(fileobj, axis_names(1), lon_tmp)
1397 call read_data(fileobj, axis_names(2), lat_tmp)
1398 ! limit lon_start, lon_end are inside lon_in
1399 ! lat_start, lat_end are inside lat_in
1400 if(data_table(index1)%lon_start < lon_tmp(1) .OR. data_table(index1)%lon_start .GT. lon_tmp(axis_sizes(1)))&
1401 call mpp_error(fatal, "data_override: lon_start is outside lon_T")
1402 if( data_table(index1)%lon_end < lon_tmp(1) .OR. data_table(index1)%lon_end .GT. lon_tmp(axis_sizes(1))) &
1403 call mpp_error(fatal, "data_override: lon_end is outside lon_T")
1404 if(data_table(index1)%lat_start < lat_tmp(1) .OR. data_table(index1)%lat_start .GT. lat_tmp(axis_sizes(2)))&
1405 call mpp_error(fatal, "data_override: lat_start is outside lat_T")
1406 if( data_table(index1)%lat_end < lat_tmp(1) .OR. data_table(index1)%lat_end .GT. lat_tmp(axis_sizes(2))) &
1407 call mpp_error(fatal, "data_override: lat_end is outside lat_T")
1408 istart = nearest_index(data_table(index1)%lon_start, lon_tmp)
1409 iend = nearest_index(data_table(index1)%lon_end, lon_tmp)
1410 jstart = nearest_index(data_table(index1)%lat_start, lat_tmp)
1411 jend = nearest_index(data_table(index1)%lat_end, lat_tmp)
1412 ! adjust the index according to is_src and js_src
1413 istart = istart - is_src + 1
1414 iend = iend - is_src + 1
1415 jstart = jstart - js_src + 1
1416 jend = jend - js_src + 1
1417 call set_override_region(id_time, data_table(index1)%region_type, istart, iend, jstart, jend)
1418 if (multifile) then
1419 if (trim(prevfilename) /= '') then
1420 call set_override_region(id_time_prev, data_table(index1)%region_type, istart, iend, jstart, jend)
1421 endif
1422 if (trim(nextfilename) /= '') then
1423 call set_override_region(id_time_next, data_table(index1)%region_type, istart, iend, jstart, jend)
1424 endif
1425 endif
1426 deallocate(lon_tmp, lat_tmp)
1427 endif
1428
1429 endif !ongrid
1430 else !curr_position >0
1431 dims = override_array(curr_position)%dims
1432 comp_domain = override_array(curr_position)%comp_domain
1433 nxc = comp_domain(2)-comp_domain(1) + 1
1434 nyc = comp_domain(4)-comp_domain(3) + 1
1435 is_src = override_array(curr_position)%is_src
1436 ie_src = override_array(curr_position)%ie_src
1437 js_src = override_array(curr_position)%js_src
1438 je_src = override_array(curr_position)%je_src
1439 window_size = override_array(curr_position)%window_size
1440 !---make sure data size match window_size
1441 if( window_size(1) .NE. size(return_data,1) .OR. window_size(2) .NE. size(return_data,2) ) then
1442 call mpp_error(fatal, "data_override: window_size does not match size(data)")
1443 endif
1444!9 Get id_time previously stored in override_array
1445 id_time = override_array(curr_position)%t_index
1446 id_time_prev = override_array(curr_position)%pt_index
1447 id_time_next = override_array(curr_position)%nt_index
1448 endif
1449!$OMP END CRITICAL
1450
1451 if( override_array(curr_position)%numwindows > 1 ) then
1452 if( .NOT. PRESENT(is_in) .OR. .NOT. PRESENT(is_in) .OR. .NOT. PRESENT(is_in) .OR. .NOT. PRESENT(is_in) ) then
1453 call mpp_error(fatal, "data_override: is_in, ie_in, js_in, je_in must be present when nwindows > 1")
1454 endif
1455 endif
1456
1457 isw = comp_domain(1)
1458 iew = comp_domain(2)
1459 jsw = comp_domain(3)
1460 jew = comp_domain(4)
1461 window_id = 1
1462 if( override_array(curr_position)%numwindows > 1 ) then
1463 nxc = comp_domain(2) - comp_domain(1) + 1
1464 nwindows_x = nxc/window_size(1)
1465 ipos = (is_in-1)/window_size(1) + 1
1466 jpos = (js_in-1)/window_size(2)
1467
1468 window_id = jpos*nwindows_x + ipos
1469 isw = isw + is_in - 1
1470 iew = isw + ie_in - is_in
1471 jsw = jsw + js_in - 1
1472 jew = jsw + je_in - js_in
1473 endif
1474
1475 if( ongrid ) then
1476 need_compute = .false.
1477 else
1478 !--- find the index for windows.
1479 need_compute=override_array(curr_position)%need_compute(window_id)
1480 endif
1481
1482 !--- call horiz_interp_new is not initialized
1483
1484 if( need_compute ) then
1485 select case(gridname)
1486 case('OCN')
1487 lon_local => lon_local_ocn; lat_local => lat_local_ocn
1488 case('ICE')
1489 lon_local => lon_local_ice; lat_local => lat_local_ice
1490 case('ATM')
1491 lon_local => lon_local_atm; lat_local => lat_local_atm
1492 case('LND')
1493 lon_local => lon_local_lnd; lat_local => lat_local_lnd
1494 case default
1495 call mpp_error(fatal,'error: gridname not recognized in data_override')
1496 end select
1497
1498 if (data_table(index1)%ext_weights) then
1499 found_weight_file = .false.
1500 do i = 1, nweight_files
1501 if (external_weights(i)%weight_filename .eq. trim(data_table(index1)%ext_weights_file_name)) then
1502 override_array(curr_position)%horz_interp(window_id) = external_weights(i)%horiz_interp
1503 found_weight_file = .true.
1504 exit
1505 endif
1506 enddo
1507
1508 if (.not. found_weight_file) then
1509 nweight_files = nweight_files + 1
1510 external_weights(nweight_files)%weight_filename = trim(data_table(index1)%ext_weights_file_name)
1511
1512 call mpp_get_global_domain(domain, xsize=nglon, ysize=nglat)
1513 call horiz_interp_read_weights(external_weights(nweight_files)%horiz_interp, &
1514 external_weights(nweight_files)%weight_filename, &
1515 lon_local(isw:iew,jsw:jew), lat_local(isw:iew,jsw:jew), &
1516 override_array(curr_position)%lon_in(is_src:ie_src+1), &
1517 override_array(curr_position)%lat_in(js_src:je_src+1), &
1518 data_table(index1)%ext_weights_source, &
1519 data_table(index1)%interpol_method, isw, iew, jsw, jew, nglon, nglat)
1520
1521 override_array(curr_position)%horz_interp(window_id) = external_weights(nweight_files)%horiz_interp
1522 endif
1523 else
1524 select case (data_table(index1)%interpol_method)
1525 case ('bilinear')
1526 call horiz_interp_new (override_array(curr_position)%horz_interp(window_id), &
1527 override_array(curr_position)%lon_in(is_src:ie_src+1), &
1528 override_array(curr_position)%lat_in(js_src:je_src+1), &
1529 lon_local(isw:iew,jsw:jew), lat_local(isw:iew,jsw:jew), interp_method="bilinear")
1530 case ('bicubic')
1531 call horiz_interp_new (override_array(curr_position)%horz_interp(window_id), &
1532 override_array(curr_position)%lon_in(is_src:ie_src+1), &
1533 override_array(curr_position)%lat_in(js_src:je_src+1), &
1534 lon_local(isw:iew,jsw:jew), lat_local(isw:iew,jsw:jew), interp_method="bicubic")
1535 end select
1536 endif
1537 override_array(curr_position)%need_compute(window_id) = .false.
1538 endif
1539
1540 ! Determine if data in netCDF file is 2D or not
1541 data_file_is_2d = .false.
1542 if((dims(3) == 1) .and. (size(return_data,3)>1)) data_file_is_2d = .true.
1543
1544 if(dims(3) .NE. 1 .and. (size(return_data,3) .NE. dims(3))) &
1545 call mpp_error(fatal, .NE..NE."data_override: dims(3) 1 and size(return_data,3) dims(3)")
1546
1547
1548 dims = get_external_field_size(id_time)
1549 if (.not. allocated(data_table(index1)%time_records)) allocate(data_table(index1)%time_records(dims(4)))
1550 call get_time_axis(id_time,data_table(index1)%time_records)
1551
1552 first_record = data_table(index1)%time_records(1)
1553 last_record = data_table(index1)%time_records(dims(4))
1554
1555 if(ongrid) then
1556 if (.not. use_comp_domain) then
1557 !< Determine the size of the halox and the part of `data` that is in the compute domain
1558 nhalox = (size(return_data,1) - nxc)/2
1559 nhaloy = (size(return_data,2) - nyc)/2
1560 startingi = lbound(return_data,1) + nhalox
1561 startingj = lbound(return_data,2) + nhaloy
1562 endingi = ubound(return_data,1) - nhalox
1563 endingj = ubound(return_data,2) - nhaloy
1564 end if
1565
1566!10 do time interp to get data in compute_domain
1567 if(data_file_is_2d) then
1568 if (use_comp_domain) then
1569
1570 ! if using consecutive files, allow to perform time interpolation between the last record of previous
1571 ! file and first record of current file OR between the last record of current file and first record of
1572 ! next file hence "bridging" over files.
1573 if_multi6: if (multifile) then
1574 if_time6: if (time<first_record) then
1575 ! previous file must be init and time must be between last record of previous file and
1576 ! first record of current file
1577 if (id_time_prev<0) call mpp_error(fatal,'data_override:previous file needed with multifile')
1578 prev_dims = get_external_field_size(id_time_prev)
1579 if (time<data_table(index1)%time_prev_records(prev_dims(4))) call mpp_error(fatal, &
1580 'data_override: time_interp_external_bridge should only be called to bridge with previous file')
1581 ! bridge with previous file
1582 call time_interp_external_bridge(id_time_prev,id_time,time,return_data(:,:,1),verbose=debug_data_override, &
1583 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1584 elseif (time>last_record) then
1585 ! next file must be init and time must be between last record of current file and
1586 ! first record of next file
1587 if (id_time_next<0) call mpp_error(fatal,'data_override:next file needed with multifile')
1588 if (time>data_table(index1)%time_next_records(1)) call mpp_error(fatal, &
1589 'data_override: time_interp_external_bridge should only be called to bridge with next file')
1590 ! bridge with next file
1591 call time_interp_external_bridge(id_time,id_time_next,time,return_data(:,:,1),verbose=debug_data_override, &
1592 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1593 else ! first_record <= time <= last_record, do not use bridge
1594 call time_interp_external(id_time,time,return_data(:,:,1),verbose=debug_data_override, &
1595 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1596 endif if_time6
1597 else ! standard behavior
1598 call time_interp_external(id_time,time,return_data(:,:,1),verbose=debug_data_override, &
1599 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1600 endif if_multi6
1601
1602 else
1603 !> If this in an ongrid case and you are not in the compute domain, send in `data` to be the correct
1604 !! size
1605
1606 ! if using consecutive files, allow to perform time interpolation between the last record of previous
1607 ! file and first record of current file OR between the last record of current file and first record of
1608 ! next file hence "bridging" over files.
1609 if_multi7: if (multifile) then
1610 if_time7: if (time<first_record) then
1611 ! previous file must be init and time must be between last record of previous file and
1612 ! first record of current file
1613 if (id_time_prev<0) call mpp_error(fatal,'data_override:previous file needed with multifile')
1614 prev_dims = get_external_field_size(id_time_prev)
1615 if (time<data_table(index1)%time_prev_records(prev_dims(4))) call mpp_error(fatal, &
1616 'data_override: time_interp_external_bridge should only be called to bridge with previous file')
1617 ! bridge with previous file
1618 call time_interp_external_bridge(id_time_prev,id_time,time,&
1619 return_data(startingi:endingi,startingj:endingj,1), &
1620 verbose=debug_data_override,is_in=is_in,ie_in=ie_in, &
1621 js_in=js_in,je_in=je_in,window_id=window_id)
1622 elseif (time>last_record) then
1623 ! next file must be init and time must be between last record of current file and
1624 ! first record of next file
1625 if (id_time_next<0) call mpp_error(fatal,'data_override:next file needed with multifile')
1626 if (time>data_table(index1)%time_next_records(1)) call mpp_error(fatal, &
1627 'data_override: time_interp_external_bridge should only be called to bridge with next file')
1628 ! bridge with next file
1629 call time_interp_external_bridge(id_time,id_time_next,time,&
1630 return_data(startingi:endingi,startingj:endingj,1), &
1631 verbose=debug_data_override,is_in=is_in,ie_in=ie_in, &
1632 js_in=js_in,je_in=je_in,window_id=window_id)
1633 else ! first_record <= time <= last_record, do not use bridge
1634 call time_interp_external(id_time,time,return_data(startingi:endingi,startingj:endingj,1), &
1635 verbose=debug_data_override,is_in=is_in,ie_in=ie_in, &
1636 js_in=js_in,je_in=je_in,window_id=window_id)
1637 endif if_time7
1638 else ! standard behavior
1639 call time_interp_external(id_time,time,return_data(startingi:endingi,startingj:endingj,1), &
1640 verbose=debug_data_override,is_in=is_in,ie_in=ie_in, &
1641 js_in=js_in,je_in=je_in,window_id=window_id)
1642 endif if_multi7
1643
1644 end if
1645 return_data(:,:,1) = return_data(:,:,1)*factor
1646 do i = 2, size(return_data,3)
1647 return_data(:,:,i) = return_data(:,:,1)
1648 end do
1649 else
1650 if (use_comp_domain) then
1651
1652 ! if using consecutive files, allow to perform time interpolation between the last record of previous
1653 ! file and first record of current file OR between the last record of current file and first record of
1654 ! next file hence "bridging" over files.
1655 if_multi8: if (multifile) then
1656 if_time8: if (time<first_record) then
1657 if (id_time_prev<0) call mpp_error(fatal,'data_override:previous file needed with multifile')
1658 prev_dims = get_external_field_size(id_time_prev)
1659 if (time<data_table(index1)%time_prev_records(prev_dims(4))) call mpp_error(fatal, &
1660 'data_override: time_interp_external_bridge should only be called to bridge with previous file')
1661 call time_interp_external_bridge(id_time_prev,id_time,time,return_data,verbose=debug_data_override, &
1662 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1663 elseif (time>last_record) then
1664 if (id_time_next<0) call mpp_error(fatal,'data_override:next file needed with multifile')
1665 if (time>data_table(index1)%time_next_records(1)) call mpp_error(fatal, &
1666 'data_override: time_interp_external_bridge should only be called to bridge with next file')
1667 call time_interp_external_bridge(id_time,id_time_next,time,return_data,verbose=debug_data_override, &
1668 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1669 else ! first_record <= time <= last_record, do not use bridge
1670 call time_interp_external(id_time,time,return_data,verbose=debug_data_override, &
1671 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1672 endif if_time8
1673 else ! standard behavior
1674 call time_interp_external(id_time,time,return_data,verbose=debug_data_override, &
1675 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1676 endif if_multi8
1677
1678 else
1679 !> If this in an ongrid case and you are not in the compute domain, send in `data` to be the correct
1680 !! size
1681
1682 ! if using consecutive files, allow to perform time interpolation between the last record of previous
1683 ! file and first record of current file OR between the last record of current file and first record of
1684 ! next file hence "bridging" over files.
1685 if_multi9: if (multifile) then
1686 if_time9: if (time<first_record) then
1687 if (id_time_prev<0) call mpp_error(fatal,'data_override:previous file needed with multifile')
1688 prev_dims = get_external_field_size(id_time_prev)
1689 if (time<data_table(index1)%time_prev_records(prev_dims(4))) call mpp_error(fatal, &
1690 'data_override: time_interp_external_bridge should only be called to bridge with previous file')
1691 call time_interp_external_bridge(id_time_prev,id_time,time,&
1692 return_data(startingi:endingi,startingj:endingj,:), &
1693 verbose=debug_data_override,is_in=is_in,ie_in=ie_in, &
1694 js_in=js_in,je_in=je_in,window_id=window_id)
1695 elseif (time>last_record) then
1696 if (id_time_next<0) call mpp_error(fatal,'data_override:next file needed with multifile')
1697 if (time>data_table(index1)%time_next_records(1)) call mpp_error(fatal, &
1698 'data_override: time_interp_external_bridge should only be called to bridge with next file')
1699 call time_interp_external_bridge(id_time,id_time_next,time,&
1700 return_data(startingi:endingi,startingj:endingj,:), &
1701 verbose=debug_data_override,is_in=is_in,ie_in=ie_in, &
1702 js_in=js_in,je_in=je_in,window_id=window_id)
1703 else ! first_record <= time <= last_record, do not use bridge
1704 call time_interp_external(id_time,time,return_data(startingi:endingi,startingj:endingj,:), &
1705 verbose=debug_data_override,is_in=is_in,ie_in=ie_in, &
1706 js_in=js_in,je_in=je_in,window_id=window_id)
1707 endif if_time9
1708 else ! standard behavior
1709 call time_interp_external(id_time,time,return_data(startingi:endingi,startingj:endingj,:), &
1710 verbose=debug_data_override,is_in=is_in,ie_in=ie_in, &
1711 js_in=js_in,je_in=je_in,window_id=window_id)
1712 endif if_multi9
1713
1714 end if
1715 return_data = return_data*factor
1716 endif
1717 else ! off grid case
1718! do time interp to get global data
1719 if(data_file_is_2d) then
1720 if( data_table(index1)%region_type == no_region ) then
1721
1722 ! if using consecutive files, allow to perform time interpolation between the last record of previous
1723 ! file and first record of current file OR between the last record of current file and first record of
1724 ! next file hence "bridging" over files.
1725 if_multi10: if (multifile) then
1726 if_time10: if (time<first_record) then
1727 if (id_time_prev<0) call mpp_error(fatal,'data_override:previous file needed with multifile')
1728 prev_dims = get_external_field_size(id_time_prev)
1729 if (time<data_table(index1)%time_prev_records(prev_dims(4))) call mpp_error(fatal, &
1730 'data_override: time_interp_external_bridge should only be called to bridge with previous file')
1731 call time_interp_external_bridge(id_time_prev,id_time,time,return_data(:,:,1), &
1732 verbose=debug_data_override, &
1733 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1734 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1735 elseif (time>last_record) then
1736 if (id_time_next<0) call mpp_error(fatal,'data_override:next file needed with multifile')
1737 if (time>data_table(index1)%time_next_records(1)) call mpp_error(fatal, &
1738 'data_override: time_interp_external_bridge should only be called to bridge with next file')
1739 call time_interp_external_bridge(id_time,id_time_next,time,return_data(:,:,1), &
1740 verbose=debug_data_override, &
1741 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1742 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1743 else ! first_record <= time <= last_record, do not use bridge
1744 call time_interp_external(id_time,time,return_data(:,:,1),verbose=debug_data_override, &
1745 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1746 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1747 endif if_time10
1748 else ! standard behavior
1749 call time_interp_external(id_time,time,return_data(:,:,1),verbose=debug_data_override, &
1750 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1751 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1752 endif if_multi10
1753
1754 return_data(:,:,1) = return_data(:,:,1)*factor
1755 do i = 2, size(return_data,3)
1756 return_data(:,:,i) = return_data(:,:,1)
1757 enddo
1758 else
1759 allocate(mask_out(size(return_data,1), size(return_data,2),1))
1760 mask_out = .false.
1761
1762 ! if using consecutive files, allow to perform time interpolation between the last record of previous
1763 ! file and first record of current file OR between the last record of current file and first record of
1764 ! next file hence "bridging" over files.
1765 if_multi11: if (multifile) then
1766 if_time11: if (time<first_record) then
1767 if (id_time_prev<0) call mpp_error(fatal,'data_override:previous file needed with multifile')
1768 prev_dims = get_external_field_size(id_time_prev)
1769 if (time<data_table(index1)%time_prev_records(prev_dims(4))) call mpp_error(fatal, &
1770 'data_override: time_interp_external_bridge should only be called to bridge with previous file')
1771 call time_interp_external_bridge(id_time_prev,id_time,time,return_data(:,:,1), &
1772 verbose=debug_data_override, &
1773 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1774 mask_out =mask_out(:,:,1), &
1775 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1776 elseif (time>last_record) then
1777 if (id_time_next<0) call mpp_error(fatal,'data_override:next file needed with multifile')
1778 if (time>data_table(index1)%time_next_records(1)) call mpp_error(fatal, &
1779 'data_override: time_interp_external_bridge should only be called to bridge with next file')
1780 call time_interp_external_bridge(id_time,id_time_next,time,return_data(:,:,1), &
1781 verbose=debug_data_override, &
1782 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1783 mask_out =mask_out(:,:,1), &
1784 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1785 else ! first_record <= time <= last_record, do not use bridge
1786 call time_interp_external(id_time,time,return_data(:,:,1),verbose=debug_data_override, &
1787 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1788 mask_out =mask_out(:,:,1), &
1789 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1790 endif if_time11
1791 else ! standard behavior
1792 call time_interp_external(id_time,time,return_data(:,:,1),verbose=debug_data_override, &
1793 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1794 mask_out =mask_out(:,:,1), &
1795 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1796 endif if_multi11
1797
1798 where(mask_out(:,:,1))
1799 return_data(:,:,1) = return_data(:,:,1)*factor
1800 end where
1801 do i = 2, size(return_data,3)
1802 where(mask_out(:,:,1))
1803 return_data(:,:,i) = return_data(:,:,1)
1804 end where
1805 enddo
1806 deallocate(mask_out)
1807 endif
1808 else
1809 if( data_table(index1)%region_type == no_region ) then
1810
1811 ! if using consecutive files, allow to perform time interpolation between the last record of previous
1812 ! file and first record of current file OR between the last record of current file and first record of
1813 ! next file hence "bridging" over files.
1814 if_multi12: if (multifile) then
1815 if_time12: if (time<first_record) then
1816 if (id_time_prev<0) call mpp_error(fatal,'data_override:previous file needed with multifile')
1817 prev_dims = get_external_field_size(id_time_prev)
1818 if (time<data_table(index1)%time_prev_records(prev_dims(4))) call mpp_error(fatal, &
1819 'data_override: time_interp_external_bridge should only be called to bridge with previous file')
1820 call time_interp_external_bridge(id_time_prev,id_time,time,return_data,verbose=debug_data_override, &
1821 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1822 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1823 elseif (time>last_record) then
1824 if (id_time_next<0) call mpp_error(fatal,'data_override:next file needed with multifile')
1825 if (time>data_table(index1)%time_next_records(1)) call mpp_error(fatal, &
1826 'data_override: time_interp_external_bridge should only be called to bridge with next file')
1827 call time_interp_external_bridge(id_time,id_time_next,time,return_data,verbose=debug_data_override, &
1828 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1829 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1830 else ! first_record <= time <= last_record, do not use bridge
1831 call time_interp_external(id_time,time,return_data,verbose=debug_data_override, &
1832 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1833 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1834 endif if_time12
1835 else ! standard behavior
1836 call time_interp_external(id_time,time,return_data,verbose=debug_data_override, &
1837 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1838 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1839 endif if_multi12
1840
1841 return_data = return_data*factor
1842 else
1843 allocate(mask_out(size(return_data,1), size(return_data,2), size(return_data,3)) )
1844 mask_out = .false.
1845
1846 ! if using consecutive files, allow to perform time interpolation between the last record of previous
1847 ! file and first record of current file OR between the last record of current file and first record of
1848 ! next file hence "bridging" over files.
1849 if_multi13: if (multifile) then
1850 if_time13: if (time<first_record) then
1851 if (id_time_prev<0) call mpp_error(fatal,'data_override:previous file needed with multifile')
1852 prev_dims = get_external_field_size(id_time_prev)
1853 if (time<data_table(index1)%time_prev_records(prev_dims(4))) call mpp_error(fatal, &
1854 'data_override: time_interp_external_bridge should only be called to bridge with previous file')
1855 call time_interp_external_bridge(id_time_prev,id_time,time,return_data,verbose=debug_data_override, &
1856 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1857 mask_out =mask_out, &
1858 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1859 elseif (time>last_record) then
1860 if (id_time_next<0) call mpp_error(fatal,'data_override:next file needed with multifile')
1861 if (time>data_table(index1)%time_next_records(1)) call mpp_error(fatal, &
1862 'data_override: time_interp_external_bridge should only be called to bridge with next file')
1863 call time_interp_external_bridge(id_time,id_time_next,time,return_data,verbose=debug_data_override, &
1864 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1865 mask_out =mask_out, &
1866 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1867 else ! first_record <= time <= last_record, do not use bridge
1868 call time_interp_external(id_time,time,return_data,verbose=debug_data_override, &
1869 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1870 mask_out =mask_out, &
1871 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1872 endif if_time13
1873 else ! standard behavior
1874 call time_interp_external(id_time,time,return_data,verbose=debug_data_override, &
1875 horz_interp=override_array(curr_position)%horz_interp(window_id), &
1876 mask_out =mask_out, &
1877 is_in=is_in,ie_in=ie_in,js_in=js_in,je_in=je_in,window_id=window_id)
1878 endif if_multi13
1879
1880 where(mask_out)
1881 return_data = return_data*factor
1882 end where
1883 deallocate(mask_out)
1884 endif
1885 endif
1886
1887 endif
1888
1889 if(PRESENT(override)) override = .true.
1890end subroutine data_override_3d_
1891
1892!> @brief Data override for 1D unstructured grids
1893subroutine data_override_ug_1d_(gridname,fieldname,return_data,time,override)
1894 character(len=3), intent(in) :: gridname !< model grid ID
1895 character(len=*), intent(in) :: fieldname !< field to override
1896 real(FMS_DATA_OVERRIDE_KIND_), dimension(:), intent(inout) :: return_data !< data returned by this call
1897 type(time_type), intent(in) :: time !< model time
1898 logical, intent(out), optional :: override !< true if the field has been overriden succesfully
1899 !local vars
1900 real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:), allocatable :: data_SG
1901 type(domainUG) :: UG_domain
1902 integer :: index1
1903 integer :: i
1904 integer, dimension(4) :: comp_domain = 0 !< istart,iend,jstart,jend for compute domain
1905
1906 !1 Look for the data file in data_table
1907 if(PRESENT(override)) override = .false.
1908 index1 = -1
1909 do i = 1, table_size
1910 if( trim(gridname) /= trim(data_table(i)%gridname)) cycle
1911 if( trim(fieldname) /= trim(data_table(i)%fieldname_code)) cycle
1912 index1 = i ! field found
1913 exit
1914 enddo
1915 if(index1 .eq. -1) return ! NO override was performed
1916
1917 call get_domainug(gridname,ug_domain,comp_domain)
1918 allocate(data_sg(comp_domain(1):comp_domain(2),comp_domain(3):comp_domain(4)))
1919
1920 call data_override_2d_(gridname,fieldname,data_sg,time,override)
1921
1922 call mpp_pass_sg_to_ug(ug_domain, data_sg(:,:), return_data(:))
1923
1924 deallocate(data_sg)
1925end subroutine data_override_ug_1d_
1926
1927!> @brief Data override for 2D unstructured grids
1928subroutine data_override_ug_2d_(gridname,fieldname,return_data,time,override)
1929 character(len=3), intent(in) :: gridname !< model grid ID
1930 character(len=*), intent(in) :: fieldname !< field to override
1931 real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:), intent(inout) :: return_data !< data returned by this call
1932 type(time_type), intent(in) :: time !< model time
1933 logical, intent(out), optional :: override !< true if the field has been overriden succesfully
1934 !local vars
1935 real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:,:), allocatable :: data_SG
1936 real(FMS_DATA_OVERRIDE_KIND_), dimension(:,:), allocatable :: data_UG
1937 type(domainUG) :: UG_domain
1938 integer :: index1
1939 integer :: i, nlevel, nlevel_max
1940 integer, dimension(4) :: comp_domain = 0 !< istart,iend,jstart,jend for compute domain
1941
1942!1 Look for the data file in data_table
1943 if(PRESENT(override)) override = .false.
1944 index1 = -1
1945 do i = 1, table_size
1946 if( trim(gridname) /= trim(data_table(i)%gridname)) cycle
1947 if( trim(fieldname) /= trim(data_table(i)%fieldname_code)) cycle
1948 index1 = i ! field found
1949 exit
1950 enddo
1951 if(index1 .eq. -1) return ! NO override was performed
1952
1953 nlevel = size(return_data,2)
1954 nlevel_max = nlevel
1955 call mpp_max(nlevel_max)
1956
1957 call get_domainug(gridname,ug_domain,comp_domain)
1958 allocate(data_sg(comp_domain(1):comp_domain(2),comp_domain(3):comp_domain(4),nlevel_max))
1959 allocate(data_ug(size(return_data,1), nlevel_max))
1960 data_sg = 0._lkind
1961 call data_override_3d_(gridname,fieldname,data_sg,time,override)
1962
1963 call mpp_pass_sg_to_ug(ug_domain, data_sg(:,:,:), data_ug(:,:))
1964 return_data(:,1:nlevel) = data_ug(:,1:nlevel)
1965
1966 deallocate(data_sg, data_ug)
1967end subroutine data_override_ug_2d_
Perform 1D interpolation between grids.
subroutine, public fms2_io_init()
Reads the fms2_io_nml.
Definition fms2_io.F90:396
Close a netcdf or domain file opened with open_file or open_virtual_file.
Definition fms2_io.F90:166
Opens a given netcdf or domain file.
Definition fms2_io.F90:122
Read data from a defined field in a file.
Definition fms2_io.F90:292
character(:) function, allocatable, public string(v, fmt)
Converts a number or a Boolean value to a string.
subroutine, public horiz_interp_init
Initialize module and writes version number to logfile.out.
These routines retrieve the axis specifications associated with the compute domains....
These routines retrieve the axis specifications associated with the data domains. The domain is a der...
These routines retrieve the axis specifications associated with the global domains....
Passes data from a structured grid to an unstructured grid Example usage:
The domain2D type contains all the necessary information to define the global, compute and data domai...
Domain information for managing data on unstructured grids.
Error handler.
Definition mpp.F90:382
Reduction operations. Find the max of scalar a from the PEs in pelist result is also automatically br...
Definition mpp.F90:538
subroutine, public time_interp_external_init()
Initialize the time_interp_external_mod module.
subroutine, public get_time_axis(index, time)
integer function, public init_external_field(file, fieldname, domain, desired_units, verbose, axis_names, axis_sizes, override, correct_leap_year_inconsistency, permit_calendar_conversion, use_comp_domain, ierr, nwindows, ignore_axis_atts, ongrid)
Initialize an external field. Buffer "num_io_buffers" (default=2) in memory to reduce memory allocati...
integer function, dimension(4), public get_external_field_size(index)
Returns size of field after call to init_external_field. Ordering is X/Y/Z/T. This call only makes se...
subroutine, public reset_src_data_region(index, is, ie, js, je)
Reallocates src_data for field from module level loaded_fields array.
Provide data from external file interpolated to current model time. Data may be local to current proc...
Type to represent amounts of time. Implemented as seconds and days to allow for larger intervals.
integer function, public get_num_blocks(file_id, block_name, parent_block_id)
Determines the number of blocks with block_name in the yaml file If parent_block_id is present,...
integer function, public open_and_parse_file(filename)
Opens and parses a yaml file.
subroutine, public get_block_ids(file_id, block_name, block_ids, parent_block_id)
Gets the the ids of the blocks with block_name in the yaml file If parent_block_id is present,...
Dermine the value of a key from a keyname.
Allocates space and initializes a derived-type variable that contains pre-computed interpolation indi...
Subroutines for reading in weight files and using that to fill in the horiz_interp type instead calcu...