19module fms_diag_field_object_mod
32use diag_data_mod,
only: diag_null, diag_not_found, diag_not_registered, diag_registered_id, &
35use fms_string_utils_mod,
only: int2str=>
string
36use mpp_mod,
only: fatal, note, warning,
mpp_error, mpp_pe, mpp_root_pe
42use fms2_io_mod,
only: fmsnetcdffile_t, fmsnetcdfdomainfile_t, fmsnetcdfunstructureddomainfile_t,
register_field, &
43 register_variable_attribute
59 integer,
allocatable,
dimension(:) :: file_ids
61 integer,
allocatable,
private :: diag_id
62 integer,
allocatable,
dimension(:) :: buffer_ids
64 integer,
private :: num_attributes
65 logical,
allocatable,
private :: static
66 logical,
allocatable,
private :: scalar
67 logical,
allocatable,
private :: registered
68 logical,
allocatable,
private :: mask_variant
69 logical,
allocatable,
private :: var_is_masked
70 logical,
allocatable,
private :: do_not_log
71 logical,
allocatable,
private :: local
72 integer,
allocatable,
private :: vartype
73 character(len=:),
allocatable,
private :: varname
74 character(len=:),
allocatable,
private :: longname
75 character(len=:),
allocatable,
private :: standname
76 character(len=:),
allocatable,
private :: units
77 character(len=:),
allocatable,
private :: modname
78 character(len=:),
allocatable,
private :: realm
80 character(len=:),
allocatable,
private :: interp_method
84 integer,
allocatable,
dimension(:),
private :: frequency
85 integer,
allocatable,
private :: tile_count
86 integer,
allocatable,
dimension(:),
private :: axis_ids
88 INTEGER ,
private :: type_of_domain
90 integer,
allocatable,
private :: area, volume
91 class(*),
allocatable,
private :: missing_value
92 class(*),
allocatable,
private :: data_range(:)
95 logical,
allocatable,
private :: multiple_send_data
97 logical,
allocatable,
private :: data_buffer_is_allocated
99 logical,
allocatable,
private :: math_needs_to_be_done
101 logical,
allocatable :: buffer_allocated
104 logical,
allocatable :: mask(:,:,:,:)
105 logical :: halo_present = .false.
109 procedure :: get_id => fms_diag_get_id
110 procedure :: id_from_name => diag_field_id_from_name
111 procedure :: copy => copy_diag_obj
112 procedure :: register => fms_register_diag_field_obj
113 procedure :: setid => set_diag_id
114 procedure :: set_type => set_vartype
115 procedure :: set_data_buffer => set_data_buffer
116 procedure :: prepare_data_buffer
117 procedure :: init_data_buffer
118 procedure :: set_data_buffer_is_allocated
121 procedure :: is_data_buffer_allocated
122 procedure :: allocate_data_buffer
123 procedure :: set_math_needs_to_be_done => set_math_needs_to_be_done
124 procedure :: add_attribute => diag_field_add_attribute
125 procedure :: vartype_inq => what_is_vartype
126 procedure :: set_var_is_masked
127 procedure :: get_var_is_masked
129 procedure :: is_static => diag_obj_is_static
130 procedure :: is_scalar
131 procedure :: is_registered => get_registered
132 procedure :: is_registeredb => diag_obj_is_registered
133 procedure :: is_mask_variant => get_mask_variant
134 procedure :: is_local => get_local
137 procedure :: has_diag_id
138 procedure :: has_attributes
139 procedure :: has_static
140 procedure :: has_registered
141 procedure :: has_mask_variant
142 procedure :: has_local
143 procedure :: has_vartype
144 procedure :: has_varname
145 procedure :: has_longname
146 procedure :: has_standname
147 procedure :: has_units
148 procedure :: has_modname
149 procedure :: has_realm
150 procedure :: has_interp_method
151 procedure :: has_frequency
152 procedure :: has_tile_count
153 procedure :: has_axis_ids
154 procedure :: has_area
155 procedure :: has_volume
156 procedure :: has_missing_value
157 procedure :: has_data_range
158 procedure :: has_input_data_buffer
160 procedure :: get_attributes
161 procedure :: get_static
162 procedure :: get_registered
163 procedure :: get_mask_variant
164 procedure :: get_local
165 procedure :: get_vartype
166 procedure :: get_varname
167 procedure :: get_longname
168 procedure :: get_standname
169 procedure :: get_units
170 procedure :: get_modname
171 procedure :: get_realm
172 procedure :: get_interp_method
173 procedure :: get_frequency
174 procedure :: get_tile_count
175 procedure :: get_area
176 procedure :: get_volume
177 procedure :: get_missing_value
178 procedure :: get_data_range
179 procedure :: get_axis_id
180 procedure :: get_data_buffer
181 procedure :: get_mask
183 procedure :: dump_field_obj
184 procedure :: get_domain
185 procedure :: get_type_of_domain
186 procedure :: set_file_ids
187 procedure :: get_dimnames
188 procedure :: get_var_skind
189 procedure :: get_longname_to_write
190 procedure :: get_multiple_send_data
191 procedure :: write_field_metadata
192 procedure :: write_coordinate_attribute
193 procedure :: get_math_needs_to_be_done
194 procedure :: add_area_volume
195 procedure :: append_time_cell_methods
196 procedure :: get_file_ids
197 procedure :: set_mask
198 procedure :: allocate_mask
199 procedure :: set_halo_present
200 procedure :: is_halo_present
201 procedure :: find_missing_value
202 procedure :: has_mask_allocated
203 procedure :: is_variable_in_file
204 procedure :: get_field_file_name
205 procedure :: generate_associated_files_att
215public :: fms_diag_fields_object_init
217public :: fms_diag_field_object_end
218public :: get_default_missing_value
219public :: check_for_slices
227subroutine fms_diag_field_object_end (ob)
229 if (
allocated(ob))
deallocate(ob)
231end subroutine fms_diag_field_object_end
236logical function fms_diag_fields_object_init(ob)
241 ob(i)%diag_id = diag_not_registered
242 ob(i)%registered = .false.
245 fms_diag_fields_object_init = .true.
246end function fms_diag_fields_object_init
249subroutine fms_register_diag_field_obj &
250 (this, modname, varname, diag_field_indices, diag_axis, axes, &
251 longname, units, missing_value, varrange, mask_variant, standname, &
252 do_not_log, err_msg, interp_method, tile_count, area, volume, realm, static, &
256 CHARACTER(len=*),
INTENT(in) :: modname
257 CHARACTER(len=*),
INTENT(in) :: varname
258 integer,
INTENT(in) :: diag_field_indices(:)
261 INTEGER,
TARGET,
OPTIONAL,
INTENT(in) :: axes(:)
262 CHARACTER(len=*),
OPTIONAL,
INTENT(in) :: longname
263 CHARACTER(len=*),
OPTIONAL,
INTENT(in) :: units
264 CHARACTER(len=*),
OPTIONAL,
INTENT(in) :: standname
265 class(*),
OPTIONAL,
INTENT(in) :: missing_value
266 class(*),
OPTIONAL,
INTENT(in) :: varrange(2)
267 LOGICAL,
OPTIONAL,
INTENT(in) :: mask_variant
268 LOGICAL,
OPTIONAL,
INTENT(in) :: do_not_log
269 CHARACTER(len=*),
OPTIONAL,
INTENT(out) :: err_msg
270 CHARACTER(len=*),
OPTIONAL,
INTENT(in) :: interp_method
274 INTEGER,
OPTIONAL,
INTENT(in) :: tile_count
275 INTEGER,
OPTIONAL,
INTENT(in) :: area
276 INTEGER,
OPTIONAL,
INTENT(in) :: volume
277 CHARACTER(len=*),
OPTIONAL,
INTENT(in) :: realm
279 LOGICAL,
OPTIONAL,
INTENT(in) :: static
280 LOGICAL,
OPTIONAL,
INTENT(in) :: multiple_send_data
283 character(len=:),
allocatable,
target :: a_name_tmp
287 this%varname = trim(varname)
288 this%modname = trim(modname)
293 if (
present(static))
then
296 this%static = .false.
300 if (
present(axes))
then
302 this%scalar = .false.
308 do i=1,
SIZE(diag_field_indices)
309 yaml_var_ptr => diag_yaml%get_diag_field_from_id(diag_field_indices(i))
312 a_name_tmp = diag_axis(axes(j))%axis%get_axis_name( yaml_var_ptr%is_file_subregional())
313 if(yaml_var_ptr%has_var_zbounds() .and. a_name_tmp .eq.
'z') &
314 a_name_tmp = trim(a_name_tmp)//
"_sub01"
315 call yaml_var_ptr%add_axis_name(a_name_tmp)
318 if(yaml_var_ptr%has_n_diurnal())
then
319 a_name_tmp =
"time_of_day_"// int2str(yaml_var_ptr%get_n_diurnal())
320 call yaml_var_ptr%add_axis_name(a_name_tmp)
323 if(.not. this%static)
then
325 call yaml_var_ptr%add_axis_name(a_name_tmp)
332 this%domain => null()
334 if(.not. this%static)
then
335 do i=1,
SIZE(diag_field_indices)
337 yaml_var_ptr => diag_yaml%get_diag_field_from_id(diag_field_indices(i))
338 call yaml_var_ptr%add_axis_name(a_name_tmp)
342 nullify(yaml_var_ptr)
345 if (
present(longname)) this%longname = trim(longname)
346 if (
present(standname)) this%standname = trim(standname)
349 if (
present(units))
then
350 if (trim(units) .ne.
"none") this%units = trim(units)
352 if (
present(realm)) this%realm = trim(realm)
353 if (
present(interp_method)) this%interp_method = trim(interp_method)
355 if (
present(tile_count))
then
356 allocate(this%tile_count)
357 this%tile_count = tile_count
360 if (
present(missing_value))
then
361 select type (missing_value)
362 type is (
integer(kind=i4_kind))
363 allocate(
integer(kind=i4_kind) :: this%missing_value)
364 this%missing_value = missing_value
365 type is (
integer(kind=i8_kind))
366 allocate(
integer(kind=i8_kind) :: this%missing_value)
367 this%missing_value = missing_value
368 type is (real(kind=r4_kind))
369 allocate(real(kind=r4_kind) :: this%missing_value)
370 this%missing_value = missing_value
371 type is (real(kind=r8_kind))
372 allocate(real(kind=r8_kind) :: this%missing_value)
373 this%missing_value = missing_value
375 call mpp_error(
"fms_register_diag_field_obj", &
376 "The missing value passed to register a diagnostic is not a r8, r4, i8, or i4",&
381 if (
present(varrange))
then
382 select type (varrange)
383 type is (
integer(kind=i4_kind))
384 allocate(
integer(kind=i4_kind) :: this%data_range(2))
385 this%data_RANGE = varrange
386 type is (
integer(kind=i8_kind))
387 allocate(
integer(kind=i8_kind) :: this%data_range(2))
388 this%data_RANGE = varrange
389 type is (real(kind=r4_kind))
390 allocate(
integer(kind=r4_kind) :: this%data_range(2))
391 this%data_RANGE = varrange
392 type is (real(kind=r8_kind))
393 allocate(
integer(kind=r8_kind) :: this%data_range(2))
394 this%data_RANGE = varrange
396 call mpp_error(
"fms_register_diag_field_obj", &
397 "The varRange passed to register a diagnostic is not a r8, r4, i8, or i4",&
402 if (
present(area))
then
403 if (area < 0)
call mpp_error(
"fms_register_diag_field_obj", &
404 "The area id passed with field_name"//trim(varname)//
" has not been registered. &
405 &Check that there is a register_diag_field call for the AREA measure and that is in the &
406 &diag_table.yaml", fatal)
411 if (
present(volume))
then
412 if (volume < 0)
call mpp_error(
"fms_register_diag_field_obj", &
413 "The volume id passed with field_name"//trim(varname)//
" has not been registered. &
414 &Check that there is a register_diag_field call for the VOLUME measure and that is in the &
415 &diag_table.yaml", fatal)
416 allocate(this%volume)
420 this%mask_variant = .false.
421 if (
present(mask_variant))
then
422 this%mask_variant = mask_variant
425 if (
present(do_not_log))
then
426 allocate(this%do_not_log)
427 this%do_not_log = do_not_log
430 if (
present(multiple_send_data))
then
431 this%multiple_send_data = multiple_send_data
433 this%multiple_send_data = .false.
439 this%num_attributes = 0
440 this%registered = .true.
441end subroutine fms_register_diag_field_obj
445subroutine set_diag_id(this , id)
448 if (
allocated(this%registered))
then
449 if (this%registered)
then
450 call mpp_error(
"set_diag_id",
"The variable"//this%varname//
" is already registered", fatal)
457end subroutine set_diag_id
460subroutine set_vartype(objin , var)
464 type is (real(kind=8))
466 type is (real(kind=4))
468 type is (
integer(kind=8))
470 type is (
integer(kind=4))
472 type is (
character(*))
475 objin%vartype = null_type_int
476 call mpp_error(
"set_vartype",
"The variable"//objin%varname//
" is not a supported type "// &
477 " r8, r4, i8, i4, or string.", warning)
479end subroutine set_vartype
486 call this%input_data_buffer%set_send_data_time(time)
496 rslt = this%input_data_buffer%get_send_data_time()
500subroutine prepare_data_buffer(this)
503 if (.not. this%multiple_send_data)
return
504 if (this%mask_variant)
return
505 call this%input_data_buffer%prepare_input_buffer_object(this%modname//
":"//this%varname)
506end subroutine prepare_data_buffer
509subroutine init_data_buffer(this)
512 if (.not. this%multiple_send_data)
return
513 if (this%mask_variant)
return
514 call this%input_data_buffer%init_input_buffer_object()
515end subroutine init_data_buffer
518subroutine set_data_buffer (this, input_data, mask, weight, is, js, ks, ie, je, ke)
520 class(*),
intent(in) :: input_data(:,:,:,:)
521 logical,
intent(in) :: mask(:,:,:,:)
523 real(kind=r8_kind),
intent(in) :: weight
524 integer,
intent(in) :: is, js, ks
526 integer,
intent(in) :: ie, je, ke
529 character(len=128) :: err_msg
530 if (.not.this%data_buffer_is_allocated) &
531 call mpp_error (
"set_data_buffer",
"The data buffer for the field "//trim(this%varname)//
" was unable to be "//&
533 if (this%multiple_send_data)
then
534 err_msg = this%input_data_buffer%update_input_buffer_object(input_data, is, js, ks, ie, je, ke, &
535 mask, this%mask, this%mask_variant, this%var_is_masked)
537 this%mask(is:ie, js:je, ks:ke, :) = mask
538 err_msg = this%input_data_buffer%set_input_buffer_object(input_data, weight, is, js, ks, ie, je, ke)
540 if (trim(err_msg) .ne.
"")
call mpp_error(fatal,
"Field:"//trim(this%varname)//
" -"//trim(err_msg))
542end subroutine set_data_buffer
545logical function allocate_data_buffer(this, input_data, diag_axis)
547 class(*),
dimension(:,:,:,:),
intent(in) :: input_data
550 character(len=128) :: err_msg
553 allocate(this%input_data_buffer)
554 err_msg = this%input_data_buffer%allocate_input_buffer_object(input_data, this%axis_ids, diag_axis)
555 if (trim(err_msg) .ne.
"")
then
556 call mpp_error(fatal,
"Field:"//trim(this%varname)//
" -"//trim(err_msg))
560 allocate_data_buffer = .true.
561end function allocate_data_buffer
563subroutine set_math_needs_to_be_done (this, math_needs_to_be_done)
565 logical,
intent (in) :: math_needs_to_be_done
566 this%math_needs_to_be_done = math_needs_to_be_done
567end subroutine set_math_needs_to_be_done
570subroutine set_var_is_masked(this, is_masked)
572 logical,
intent (in) :: is_masked
574 this%var_is_masked = is_masked
575end subroutine set_var_is_masked
579function get_var_is_masked(this) &
584 rslt = this%var_is_masked
585end function get_var_is_masked
588subroutine set_data_buffer_is_allocated (this, data_buffer_is_allocated)
590 logical,
intent (in) :: data_buffer_is_allocated
592 this%data_buffer_is_allocated = data_buffer_is_allocated
593end subroutine set_data_buffer_is_allocated
597pure logical function is_data_buffer_allocated (this)
600 is_data_buffer_allocated = .false.
601 if (
allocated(this%data_buffer_is_allocated)) is_data_buffer_allocated = this%data_buffer_is_allocated
605subroutine what_is_vartype(this)
607 if (.not.
allocated(this%vartype))
then
608 call mpp_error(
"what_is_vartype",
"The variable type has not been set prior to this call", warning)
611 select case (this%vartype)
613 call mpp_error(
"what_is_vartype",
"The variable type of "//trim(this%varname)//&
614 " is REAL(kind=8)", note)
616 call mpp_error(
"what_is_vartype",
"The variable type of "//trim(this%varname)//&
617 " is REAL(kind=4)", note)
619 call mpp_error(
"what_is_vartype",
"The variable type of "//trim(this%varname)//&
620 " is INTEGER(kind=8)", note)
622 call mpp_error(
"what_is_vartype",
"The variable type of "//trim(this%varname)//&
623 " is INTEGER(kind=4)", note)
625 call mpp_error(
"what_is_vartype",
"The variable type of "//trim(this%varname)//&
626 " is CHARACTER(*)", note)
628 call mpp_error(
"what_is_vartype",
"The variable type of "//trim(this%varname)//&
629 " was not set", warning)
631 call mpp_error(
"what_is_vartype",
"The variable type of "//trim(this%varname)//&
632 " is not supported by diag_manager", fatal)
634end subroutine what_is_vartype
638subroutine copy_diag_obj(this , objout)
644 if (
allocated(this%registered))
then
645 objout%registered = this%registered
647 call mpp_error(
"copy_diag_obj",
"You can only copy objects that have been registered",warning)
649 objout%diag_id = this%diag_id
651 if (
allocated(this%attributes)) objout%attributes = this%attributes
652 objout%static = this%static
653 if (
allocated(this%frequency)) objout%frequency = this%frequency
654 if (
allocated(this%varname)) objout%varname = this%varname
656end subroutine copy_diag_obj
661pure integer function fms_diag_get_id (this)
result(diag_id)
664 if (
allocated(this%registered))
then
666 diag_id = this%diag_id
669 diag_id = diag_not_registered
671end function fms_diag_get_id
678function fms_diag_obj_as_string_basic(this)
result(rslt)
680 character(:),
allocatable :: rslt
681 character (len=:),
allocatable :: registered, vartype, varname, diag_id
682 if ( .not.
allocated (this))
then
687 rslt =
"[Obj:" // varname //
"," // vartype //
"," // registered //
"," // diag_id //
"]"
709 if(
allocated (this%varname))
then
710 varname = this%varname
715 rslt =
"[Obj:" // varname //
"," // vartype //
"," // registered //
"," // diag_id //
"]"
717end function fms_diag_obj_as_string_basic
720function diag_obj_is_registered (this)
result (rslt)
723 rslt = this%registered
724end function diag_obj_is_registered
726function diag_obj_is_static (this)
result (rslt)
730 if (
allocated(this%static)) rslt = this%static
731end function diag_obj_is_static
735function is_scalar (this)
result (rslt)
739end function is_scalar
746function get_attributes (this) &
752 if (this%num_attributes > 0 ) rslt => this%attributes
753end function get_attributes
757pure function get_static (this) &
762end function get_static
766pure function get_registered (this) &
770 rslt = this%registered
771end function get_registered
775pure function get_mask_variant (this) &
780 if (
allocated(this%mask_variant)) rslt = this%mask_variant
781end function get_mask_variant
785pure function get_local (this) &
790end function get_local
794pure function get_vartype (this) &
799end function get_vartype
803pure function get_varname (this, to_write) &
806 logical,
optional,
intent(in) :: to_write
807 character(len=:),
allocatable :: rslt
811 if (
present(to_write))
then
814 rslt = this%diag_field(1)%get_var_outname()
818end function get_varname
822pure function get_longname (this) &
825 character(len=:),
allocatable :: rslt
826 if (
allocated(this%longname))
then
829 rslt = diag_null_string
831end function get_longname
835pure function get_standname (this) &
838 character(len=:),
allocatable :: rslt
839 if (
allocated(this%standname))
then
840 rslt = this%standname
842 rslt = diag_null_string
844end function get_standname
848pure function get_units (this) &
851 character(len=:),
allocatable :: rslt
852 if (
allocated(this%units))
then
855 rslt = diag_null_string
857end function get_units
861pure function get_modname (this) &
864 character(len=:),
allocatable :: rslt
865 if (
allocated(this%modname))
then
868 rslt = diag_null_string
870end function get_modname
874pure function get_realm (this) &
877 character(len=:),
allocatable :: rslt
878 if (
allocated(this%realm))
then
881 rslt = diag_null_string
883end function get_realm
887pure function get_interp_method (this) &
890 character(len=:),
allocatable :: rslt
891 if (
allocated(this%interp_method))
then
892 rslt = this%interp_method
894 rslt = diag_null_string
896end function get_interp_method
900pure function get_frequency (this) &
903 integer,
allocatable,
dimension (:) :: rslt
904 if (
allocated(this%frequency))
then
905 allocate (rslt(
size(this%frequency)))
906 rslt = this%frequency
911end function get_frequency
915pure function get_tile_count (this) &
919 if (
allocated(this%tile_count))
then
920 rslt = this%tile_count
924end function get_tile_count
928pure function get_area (this) &
932 if (
allocated(this%area))
then
941pure function get_volume (this) &
945 if (
allocated(this%volume))
then
950end function get_volume
957function get_missing_value (this, var_type) &
960 integer,
intent(in) :: var_type
963 class(*),
allocatable :: rslt
965 if (.not.
allocated(this%missing_value))
then
967 "The missing value is not allocated", fatal)
972 select case (var_type)
974 allocate (real(kind=r4_kind) :: rslt)
975 select type (miss => this%missing_value)
976 type is (real(kind=r4_kind))
978 type is (real(kind=r4_kind))
979 rslt = real(miss, kind=r4_kind)
981 type is (real(kind=r8_kind))
983 type is (real(kind=r4_kind))
984 rslt = real(miss, kind=r4_kind)
988 allocate (real(kind=r8_kind) :: rslt)
989 select type (miss => this%missing_value)
990 type is (real(kind=r4_kind))
992 type is (real(kind=r8_kind))
993 rslt = real(miss, kind=r8_kind)
995 type is (real(kind=r8_kind))
997 type is (real(kind=r8_kind))
998 rslt = real(miss, kind=r8_kind)
1003end function get_missing_value
1010function get_data_range (this, var_type) &
1013 integer,
intent(in) :: var_type
1015 class(*),
allocatable :: rslt(:)
1017 if ( .not.
allocated(this%data_RANGE))
call mpp_error (
"get_data_RANGE", &
1018 "The data_RANGE value is not allocated", fatal)
1022 select case (var_type)
1024 allocate (real(kind=r4_kind) :: rslt(2))
1025 select type (r => this%data_RANGE)
1026 type is (real(kind=r4_kind))
1028 type is (real(kind=r4_kind))
1029 rslt = real(r, kind=r4_kind)
1031 type is (real(kind=r8_kind))
1033 type is (real(kind=r4_kind))
1034 rslt = real(r, kind=r4_kind)
1038 allocate (real(kind=r8_kind) :: rslt(2))
1039 select type (r => this%data_RANGE)
1040 type is (real(kind=r4_kind))
1042 type is (real(kind=r8_kind))
1043 rslt = real(r, kind=r8_kind)
1045 type is (real(kind=r8_kind))
1047 type is (real(kind=r8_kind))
1048 rslt = real(r, kind=r8_kind)
1052end function get_data_range
1056function get_axis_id (this) &
1059 integer,
pointer,
dimension(:) :: rslt
1061 if(
allocated(this%axis_ids))
then
1062 rslt => this%axis_ids
1066end function get_axis_id
1070function get_domain (this) &
1075 if (
associated(this%domain))
then
1081end function get_domain
1085pure function get_type_of_domain (this) &
1090 rslt = this%type_of_domain
1091end function get_type_of_domain
1094subroutine set_file_ids(this, file_ids)
1096 integer,
intent(in) :: file_ids(:)
1098 allocate(this%file_ids(
size(file_ids)))
1099 this%file_ids = file_ids
1100end subroutine set_file_ids
1104pure function get_var_skind(this, field_yaml) &
1109 character(len=:),
allocatable :: rslt
1113 var_kind = field_yaml%get_var_kind()
1114 select case (var_kind)
1125end function get_var_skind
1129pure function get_multiple_send_data(this) &
1133 rslt = this%multiple_send_data
1134end function get_multiple_send_data
1138pure function get_longname_to_write(this, field_yaml) &
1143 character(len=:),
allocatable :: rslt
1145 rslt = field_yaml%get_var_longname()
1146 if (rslt .eq.
"")
then
1148 rslt = this%get_longname()
1152 if (rslt .eq.
"")
then
1154 rslt = field_yaml%get_var_varname()
1156end function get_longname_to_write
1159subroutine get_dimnames(this, diag_axis, field_yaml, unlim_dimname, dimnames, is_regional)
1163 character(len=*),
intent(in) :: unlim_dimname
1164 character(len=120),
allocatable,
intent(out) :: dimnames(:)
1166 logical,
intent(in) :: is_regional
1171 character(len=23) :: diurnal_axis_name
1173 if (this%is_static())
then
1174 naxis =
size(this%axis_ids)
1176 naxis =
size(this%axis_ids) + 1
1179 if (field_yaml%has_n_diurnal())
then
1183 allocate(dimnames(naxis))
1186 if (field_yaml%has_var_zbounds())
then
1187 do i = 1,
size(this%axis_ids)
1188 axis_ptr => diag_axis(this%axis_ids(i))
1189 if (axis_ptr%axis%is_z_axis())
then
1190 dimnames(i) = axis_ptr%axis%get_axis_name(is_regional)//
"_sub01"
1192 dimnames(i) = axis_ptr%axis%get_axis_name(is_regional)
1196 do i = 1,
size(this%axis_ids)
1197 axis_ptr => diag_axis(this%axis_ids(i))
1198 dimnames(i) = axis_ptr%axis%get_axis_name(is_regional)
1203 if (field_yaml%has_n_diurnal())
then
1204 WRITE (diurnal_axis_name,
'(a,i2.2)')
'time_of_day_', field_yaml%get_n_diurnal()
1205 dimnames(naxis - 1) = trim(diurnal_axis_name)
1209 if (.not. this%is_static()) dimnames(naxis) = unlim_dimname
1211end subroutine get_dimnames
1215subroutine register_field_wrap(fms2io_fileobj, varname, vartype, dimensions)
1216 class(fmsnetcdffile_t),
INTENT(INOUT) :: fms2io_fileobj
1217 character(len=*),
INTENT(IN) :: varname
1218 character(len=*),
INTENT(IN) :: vartype
1219 character(len=*),
optional,
INTENT(IN) :: dimensions(:)
1221 select type(fms2io_fileobj)
1222 type is (fmsnetcdffile_t)
1223 call register_field(fms2io_fileobj, varname, vartype, dimensions)
1224 type is (fmsnetcdfdomainfile_t)
1225 call register_field(fms2io_fileobj, varname, vartype, dimensions)
1226 type is (fmsnetcdfunstructureddomainfile_t)
1227 call register_field(fms2io_fileobj, varname, vartype, dimensions)
1229end subroutine register_field_wrap
1232subroutine write_field_metadata(this, fms2io_fileobj, file_id, yaml_id, diag_axis, unlim_dimname, is_regional, &
1235 class(fmsnetcdffile_t),
INTENT(INOUT) :: fms2io_fileobj
1236 integer,
intent(in) :: file_id
1237 integer,
intent(in) :: yaml_id
1239 character(len=*),
intent(in) :: unlim_dimname
1240 logical,
intent(in) :: is_regional
1241 character(len=*),
intent(in) :: cell_measures
1244 character(len=:),
allocatable :: var_name
1245 character(len=:),
allocatable :: long_name
1246 character(len=:),
allocatable :: units
1247 character(len=120),
allocatable :: dimnames(:)
1248 character(len=120) :: cell_methods
1250 character (len=MAX_STR_LEN),
allocatable :: yaml_field_attributes(:,:)
1251 character(len=:),
allocatable :: interp_method_tmp
1252 integer :: interp_method_len
1254 field_yaml => diag_yaml%get_diag_field_from_id(yaml_id)
1255 var_name = field_yaml%get_var_outname()
1257 if (
allocated(this%axis_ids))
then
1258 call this%get_dimnames(diag_axis, field_yaml, unlim_dimname, dimnames, is_regional)
1259 call register_field_wrap(fms2io_fileobj, var_name, this%get_var_skind(field_yaml), dimnames)
1261 if (this%is_static())
then
1262 call register_field_wrap(fms2io_fileobj, var_name, this%get_var_skind(field_yaml))
1266 call register_field_wrap(fms2io_fileobj, var_name, this%get_var_skind(field_yaml), (/unlim_dimname/))
1270 long_name = this%get_longname_to_write(field_yaml)
1271 call register_variable_attribute(fms2io_fileobj, var_name,
"long_name", long_name, str_len=len_trim(long_name))
1273 units = this%get_units()
1274 if (units .ne. diag_null_string) &
1275 call register_variable_attribute(fms2io_fileobj, var_name,
"units", units, str_len=len_trim(units))
1277 if (this%has_missing_value())
then
1278 call register_variable_attribute(fms2io_fileobj, var_name,
"missing_value", &
1279 this%get_missing_value(field_yaml%get_var_kind()))
1280 call register_variable_attribute(fms2io_fileobj, var_name,
"_FillValue", &
1281 this%get_missing_value(field_yaml%get_var_kind()))
1283 call register_variable_attribute(fms2io_fileobj, var_name,
"missing_value", &
1284 get_default_missing_value(field_yaml%get_var_kind()))
1285 call register_variable_attribute(fms2io_fileobj, var_name,
"_FillValue", &
1286 get_default_missing_value(field_yaml%get_var_kind()))
1289 if (this%has_data_RANGE())
then
1290 call register_variable_attribute(fms2io_fileobj, var_name,
"valid_range", &
1291 this%get_data_range(field_yaml%get_var_kind()))
1294 if (this%has_interp_method())
then
1295 interp_method_tmp = this%interp_method
1296 interp_method_len = len_trim(interp_method_tmp)
1297 call register_variable_attribute(fms2io_fileobj, var_name,
"interp_method", interp_method_tmp, &
1298 str_len=interp_method_len)
1304 do i = 1, this%num_attributes
1305 call this%attributes(i)%write_metadata(fms2io_fileobj, var_name, &
1306 cell_methods=cell_methods)
1310 call this%append_time_cell_methods(cell_methods, field_yaml)
1311 if (trim(cell_methods) .ne.
"") &
1312 call register_variable_attribute(fms2io_fileobj, var_name,
"cell_methods", &
1313 trim(adjustl(cell_methods)), str_len=len_trim(adjustl(cell_methods)))
1318 if (trim(cell_measures) .ne.
"") &
1319 call register_variable_attribute(fms2io_fileobj, var_name,
"cell_measures", &
1320 trim(adjustl(cell_measures)), str_len=len_trim(adjustl(cell_measures)))
1323 if (this%has_standname()) &
1324 call register_variable_attribute(fms2io_fileobj, var_name,
"standard_name", &
1325 trim(this%get_standname()), str_len=len_trim(this%get_standname()))
1327 call this%write_coordinate_attribute(fms2io_fileobj, var_name, diag_axis)
1329 if (field_yaml%has_var_attributes())
then
1330 yaml_field_attributes = field_yaml%get_var_attributes()
1331 do i = 1,
size(yaml_field_attributes,1)
1332 call register_variable_attribute(fms2io_fileobj, var_name, trim(yaml_field_attributes(i,1)), &
1333 trim(yaml_field_attributes(i,2)), str_len=len_trim(yaml_field_attributes(i,2)))
1335 deallocate(yaml_field_attributes)
1337end subroutine write_field_metadata
1341subroutine write_coordinate_attribute (this, fms2io_fileobj, var_name, diag_axis)
1343 class(fmsnetcdffile_t),
INTENT(INOUT) :: fms2io_fileobj
1344 character(len=*),
intent(in) :: var_name
1348 character(len = 252) :: aux_coord
1351 if (.not.
allocated(this%axis_ids))
return
1356 do i = 1,
size(this%axis_ids)
1357 select type (obj => diag_axis(this%axis_ids(i))%axis)
1359 if (obj%has_aux())
then
1360 aux_coord = trim(aux_coord)//
" "//obj%get_aux()
1365 if (trim(aux_coord) .eq.
"")
return
1367 call register_variable_attribute(fms2io_fileobj, var_name,
"coordinates", &
1368 trim(adjustl(aux_coord)), str_len=len_trim(adjustl(aux_coord)))
1370end subroutine write_coordinate_attribute
1374function get_data_buffer (this) &
1377 class(*),
dimension(:,:,:,:),
pointer :: rslt
1379 if (.not. this%data_buffer_is_allocated) &
1380 call mpp_error(fatal,
"The input data buffer for the field:"&
1381 //trim(this%varname)//
" was never allocated.")
1383 rslt => this%input_data_buffer%get_buffer()
1384end function get_data_buffer
1392 type(
real(kind=r8_kind)),
pointer :: rslt
1394 if (.not. this%data_buffer_is_allocated) &
1395 call mpp_error(fatal,
"The input data buffer for the field:"&
1396 //trim(this%varname)//
" was never allocated.")
1398 rslt => this%input_data_buffer%get_weight()
1403pure logical function get_math_needs_to_be_done(this)
1405 get_math_needs_to_be_done = .false.
1406 if (
allocated(this%math_needs_to_be_done)) get_math_needs_to_be_done = this%math_needs_to_be_done
1407end function get_math_needs_to_be_done
1419pure logical function has_diag_id (this)
1421 has_diag_id =
allocated(this%diag_id)
1422end function has_diag_id
1426pure logical function has_attributes (this)
1428 has_attributes = this%num_attributes > 0
1429end function has_attributes
1433pure logical function has_static (this)
1435 has_static =
allocated(this%static)
1436end function has_static
1440pure logical function has_registered (this)
1442 has_registered =
allocated(this%registered)
1443end function has_registered
1447pure logical function has_mask_variant (this)
1449 has_mask_variant =
allocated(this%mask_variant)
1450end function has_mask_variant
1454pure logical function has_local (this)
1456 has_local =
allocated(this%local)
1457end function has_local
1461pure logical function has_vartype (this)
1463 has_vartype =
allocated(this%vartype)
1464end function has_vartype
1468pure logical function has_varname (this)
1470 has_varname =
allocated(this%varname)
1471end function has_varname
1475pure logical function has_longname (this)
1477 has_longname =
allocated(this%longname)
1478end function has_longname
1482pure logical function has_standname (this)
1484 has_standname =
allocated(this%standname)
1485end function has_standname
1489pure logical function has_units (this)
1491 has_units =
allocated(this%units)
1492end function has_units
1496pure logical function has_modname (this)
1498 has_modname =
allocated(this%modname)
1499end function has_modname
1503pure logical function has_realm (this)
1505 has_realm =
allocated(this%realm)
1506end function has_realm
1510pure logical function has_interp_method (this)
1512 has_interp_method =
allocated(this%interp_method)
1513end function has_interp_method
1517pure logical function has_frequency (this)
1519 has_frequency =
allocated(this%frequency)
1520end function has_frequency
1524pure logical function has_tile_count (this)
1526 has_tile_count =
allocated(this%tile_count)
1527end function has_tile_count
1531pure logical function has_axis_ids (this)
1533 has_axis_ids =
allocated(this%axis_ids)
1534end function has_axis_ids
1538pure logical function has_area (this)
1540 has_area =
allocated(this%area)
1541end function has_area
1545pure logical function has_volume (this)
1547 has_volume =
allocated(this%volume)
1548end function has_volume
1552pure logical function has_missing_value (this)
1554 has_missing_value =
allocated(this%missing_value)
1555end function has_missing_value
1559pure logical function has_data_range (this)
1561 has_data_range =
allocated(this%data_RANGE)
1562end function has_data_range
1566pure logical function has_input_data_buffer (this)
1568 has_input_data_buffer =
allocated(this%input_data_buffer)
1569end function has_input_data_buffer
1572subroutine diag_field_add_attribute(this, att_name, att_value)
1574 character(len=*),
intent(in) :: att_name
1575 class(*),
intent(in) :: att_value(:)
1577 this%num_attributes = this%num_attributes + 1
1579 call mpp_error(fatal,
"diag_field_add_attribute: Number of attributes exceeds max_field_attributes for field:"&
1580 //trim(this%varname)//
". Increase diag_manager_nml:max_field_attributes.")
1582 call this%attributes(this%num_attributes)%add(att_name, att_value)
1583end subroutine diag_field_add_attribute
1587function get_default_missing_value(var_type) &
1590 integer,
intent(in) :: var_type
1591 class(*),
allocatable :: rslt
1593 select case(var_type)
1595 allocate(real(kind=r4_kind) :: rslt)
1598 allocate(real(kind=r8_kind) :: rslt)
1606PURE FUNCTION diag_field_id_from_name(this, module_name, field_name) &
1607 result(diag_field_id)
1609 CHARACTER(len=*),
INTENT(in) :: module_name
1610 CHARACTER(len=*),
INTENT(in) :: field_name
1612 integer :: diag_field_id
1615 if (this%get_varname() .eq. trim(field_name) .and. &
1616 this%get_modname() .eq. trim(module_name))
then
1617 diag_field_id = this%get_id()
1619end function diag_field_id_from_name
1622subroutine add_area_volume(this, area, volume)
1624 INTEGER,
optional,
INTENT(in) :: area
1625 INTEGER,
optional,
INTENT(in) :: volume
1627 if (
present(area))
then
1631 call mpp_error(fatal,
"diag_field_add_cell_measures: the area id is not valid. &
1632 &Verify that the area_id passed in to the field:"//this%varname// &
1633 " is valid and that the field is registered and in the diag_table.yaml")
1637 if (
present(volume))
then
1638 if (volume > 0)
then
1639 this%volume = volume
1641 call mpp_error(fatal,
"diag_field_add_cell_measures: the volume id is not valid. &
1642 &Verify that the volume_id passed in to the field:"//this%varname// &
1643 " is valid and that the field is registered and in the diag_table.yaml")
1647end subroutine add_area_volume
1650subroutine append_time_cell_methods(this, cell_methods, field_yaml)
1652 character(len=*),
intent(inout) :: cell_methods
1655 if (this%static)
then
1656 cell_methods = trim(cell_methods)//
" time: point "
1660 select case (field_yaml%get_var_reduction())
1662 cell_methods = trim(cell_methods)//
" time: point "
1664 cell_methods = trim(cell_methods)//
" time: mean"
1666 cell_methods = trim(cell_methods)//
" time: mean_pow"//int2str(field_yaml%get_pow_value())
1668 cell_methods = trim(cell_methods)//
" time: root_mean_square"
1670 cell_methods = trim(cell_methods)//
" time: max"
1672 cell_methods = trim(cell_methods)//
" time: min"
1674 cell_methods = trim(cell_methods)//
" time: mean"
1676 cell_methods = trim(cell_methods)//
" time: sum"
1678end subroutine append_time_cell_methods
1681subroutine dump_field_obj (this, unit_num)
1683 integer,
intent(in) :: unit_num
1686 if( mpp_pe() .eq. mpp_root_pe())
then
1687 if(
allocated(this%file_ids))
write(unit_num, *)
'file_ids:' ,this%file_ids
1688 if(
allocated(this%diag_id))
write(unit_num, *)
'diag_id:' ,this%diag_id
1689 if(
allocated(this%static))
write(unit_num, *)
'static:' ,this%static
1690 if(
allocated(this%registered))
write(unit_num, *)
'registered:' ,this%registered
1691 if(
allocated(this%mask_variant))
write(unit_num, *)
'mask_variant:' ,this%mask_variant
1692 if(
allocated(this%do_not_log))
write(unit_num, *)
'do_not_log:' ,this%do_not_log
1693 if(
allocated(this%local))
write(unit_num, *)
'local:' ,this%local
1694 if(
allocated(this%vartype))
write(unit_num, *)
'vartype:' ,this%vartype
1695 if(
allocated(this%varname))
write(unit_num, *)
'varname:' ,this%varname
1696 if(
allocated(this%longname))
write(unit_num, *)
'longname:' ,this%longname
1697 if(
allocated(this%standname))
write(unit_num, *)
'standname:' ,this%standname
1698 if(
allocated(this%units))
write(unit_num, *)
'units:' ,this%units
1699 if(
allocated(this%modname))
write(unit_num, *)
'modname:' ,this%modname
1700 if(
allocated(this%realm))
write(unit_num, *)
'realm:' ,this%realm
1701 if(
allocated(this%interp_method))
write(unit_num, *)
'interp_method:' ,this%interp_method
1702 if(
allocated(this%tile_count))
write(unit_num, *)
'tile_count:' ,this%tile_count
1703 if(
allocated(this%axis_ids))
write(unit_num, *)
'axis_ids:' ,this%axis_ids
1704 write(unit_num, *)
'type_of_domain:' ,this%type_of_domain
1705 if(
allocated(this%area))
write(unit_num, *)
'area:' ,this%area
1706 if(
allocated(this%missing_value))
then
1707 select type(missing_val => this%missing_value)
1708 type is (real(r4_kind))
1709 write(unit_num, *)
'missing_value:', missing_val
1710 type is (real(r8_kind))
1711 write(unit_num, *)
'missing_value:' ,missing_val
1712 type is(
integer(i4_kind))
1713 write(unit_num, *)
'missing_value:' ,missing_val
1714 type is(
integer(i8_kind))
1715 write(unit_num, *)
'missing_value:' ,missing_val
1718 if(
allocated( this%data_RANGE))
then
1719 select type(drange => this%data_RANGE)
1720 type is (real(r4_kind))
1721 write(unit_num, *)
'data_RANGE:' ,drange
1722 type is (real(r8_kind))
1723 write(unit_num, *)
'data_RANGE:' ,drange
1724 type is(
integer(i4_kind))
1725 write(unit_num, *)
'data_RANGE:' ,drange
1726 type is(
integer(i8_kind))
1727 write(unit_num, *)
'data_RANGE:' ,drange
1730 write(unit_num, *)
'num_attributes:' ,this%num_attributes
1731 if(
allocated(this%attributes))
then
1732 do i=1, this%num_attributes
1733 if(
allocated(this%attributes(i)%att_value))
then
1734 select type( val => this%attributes(i)%att_value)
1735 type is (real(r8_kind))
1736 write(unit_num, *)
'attribute name', this%attributes(i)%att_name,
'val:', val
1737 type is (real(r4_kind))
1738 write(unit_num, *)
'attribute name', this%attributes(i)%att_name,
'val:', val
1739 type is (
integer(i4_kind))
1740 write(unit_num, *)
'attribute name', this%attributes(i)%att_name,
'val:', val
1741 type is (
integer(i8_kind))
1742 write(unit_num, *)
'attribute name', this%attributes(i)%att_name,
'val:', val
1754function get_starting_compute_domain(axis_ids, diag_axis) &
1755result(compute_domain)
1756 integer,
intent(in) :: axis_ids(:)
1759 integer :: compute_domain(4)
1761 integer :: compute_idx(2)
1765 axis_loop:
do a = 1,
size(axis_ids)
1766 select type (axis => diag_axis(axis_ids(a))%axis)
1768 call axis%get_compute_domain(compute_idx, dummy)
1769 if ( compute_idx(1) .ne. diag_null) compute_domain(a) = compute_idx(1)
1772end function get_starting_compute_domain
1775pure function get_file_ids(this)
1777 integer,
allocatable :: get_file_ids(:)
1778 get_file_ids = this%file_ids
1783function get_mask(this)
1785 logical,
pointer :: get_mask(:,:,:,:)
1786 get_mask => this%mask
1787end function get_mask
1791subroutine allocate_mask(this, mask_in, omp_axis)
1793 logical,
intent(in) :: mask_in(:,:,:,:)
1795 integer :: axis_num, length(4)
1796 integer,
pointer :: id_num
1798 if(.not.
present(omp_axis))
then
1799 allocate(this%mask(
size(mask_in,1),
size(mask_in,2),
size(mask_in,3), &
1804 do axis_num=1,
size(this%axis_ids)
1805 id_num => this%axis_ids(axis_num)
1806 select type(axis => omp_axis(id_num)%axis)
1808 length(axis_num) = axis%axis_length()
1811 allocate(this%mask(length(1), length(2), length(3), length(4)))
1813end subroutine allocate_mask
1816subroutine set_mask(this, mask_in, field_info, is, js, ks, ie, je, ke)
1818 logical,
intent(in) :: mask_in(:,:,:,:)
1819 character(len=*),
intent(in) :: field_info
1820 integer,
optional,
intent(in) :: is, js, ks, ie, je, ke
1821 if(
present(is))
then
1822 if(is .lt. lbound(this%mask,1) .or. ie .gt. ubound(this%mask,1) .or. &
1823 js .lt. lbound(this%mask,2) .or. je .gt. ubound(this%mask,2) .or. &
1824 ks .lt. lbound(this%mask,3) .or. ke .gt. ubound(this%mask,3))
then
1825 print *,
"PE:", int2str(mpp_pe()),
"The size of the mask is", &
1827 "But the indices passed in are is=", int2str(is),
" ie=", int2str(ie),&
1828 " js=", int2str(js),
" je=", int2str(je), &
1829 " ks=", int2str(ks),
" ke=", int2str(ke), &
1830 " ", trim(field_info)
1831 call mpp_error(fatal,
"set_mask:: given indices out of bounds for allocated mask")
1833 this%mask(is:ie, js:je, ks:ke, :) = mask_in
1837end subroutine set_mask
1840subroutine set_halo_present(this)
1842 this%halo_present = .true.
1843end subroutine set_halo_present
1846pure function is_halo_present(this)
1848 logical :: is_halo_present
1849 is_halo_present = this%halo_present
1850end function is_halo_present
1855function find_missing_value(this, missing_val) &
1858 class(*),
allocatable,
intent(out) :: missing_val
1859 real(r8_kind),
allocatable :: res
1862 if(this%has_missing_value())
then
1863 missing_val = this%get_missing_value(this%get_vartype())
1865 vtype = this%get_vartype()
1866 if(vtype .eq.
r8)
then
1873 select type(missing_val)
1874 type is (real(r8_kind))
1876 type is (real(r4_kind))
1877 res = real(missing_val, r8_kind)
1879end function find_missing_value
1884pure logical function has_mask_allocated(this)
1886 has_mask_allocated =
allocated(this%mask)
1887end function has_mask_allocated
1891pure function is_variable_in_file(this, file_id) &
1894 integer,
intent(in) :: file_id
1900 if (any(this%file_ids .eq. file_id)) res = .true.
1901end function is_variable_in_file
1905function get_field_file_name(this) &
1908 character(len=:),
allocatable :: res
1910 res = this%diag_field(1)%get_var_fname()
1911end function get_field_file_name
1914subroutine generate_associated_files_att(this, att, start_time)
1916 character(len=*),
intent(inout) :: att
1917 type(
time_type),
intent(in) :: start_time
1919 character(len=:),
allocatable :: field_name
1920 character(len=FMS_FILE_LEN) :: file_name
1921 character(len=128) :: start_date
1923 integer :: year, month, day, hour, minute, second
1924 field_name = this%get_varname(to_write = .true.)
1928 if (index(att, field_name) .ne. 0)
return
1930 file_name = this%get_field_file_name()
1933 call get_date(start_time, year, month, day, hour, minute, second)
1934 write (start_date,
'(1I20.4, 2I2.2)') year, month, day
1935 file_name = trim(adjustl(start_date))//
'.'//trim(file_name)
1938 att = trim(att)//
" "//trim(field_name)//
": "//trim(file_name)//
".nc"
1939end subroutine generate_associated_files_att
1943function check_for_slices(field, diag_axis, var_size) &
1947 integer,
intent(in) :: var_size(:)
1954 if (.not. field%has_axis_ids())
then
1958 do i = 1,
size(field%axis_ids)
1959 select type (axis_obj => diag_axis(field%axis_ids(i))%axis)
1961 if (axis_obj%axis_length() .ne. var_size(i))
then
1969end module fms_diag_field_object_mod
integer, parameter max_str_len
Max length for a string.
integer, parameter no_domain
Use the FmsNetcdfFile_t fileobj.
character(len=7) avg_name
Name of the average fields.
integer, parameter diag_field_not_found
Return value for a diag_field that isn't found in the diag_table.
integer, parameter string
s is the 19th letter of the alphabet
integer, parameter time_min
The reduction method is min value.
integer, parameter time_diurnal
The reduction method is diurnal.
integer, parameter time_power
The reduction method is average with exponents.
real(r8_kind), parameter cmor_missing_value
CMOR standard missing value.
logical prepend_date
Should the history file have the start date prepended to the file name. .TRUE. is only supported if t...
integer, parameter time_average
The reduction method is average of values.
integer, parameter time_sum
The reduction method is sum of values.
integer, parameter time_rms
The reudction method is root mean square of values.
logical module_is_initialized
Indicate if diag_manager has been initialized.
integer, parameter time_none
There is no reduction method.
integer, parameter time_max
The reduction method is max value.
integer, parameter r8
Supported type/kind of the variable.
integer max_field_attributes
Maximum number of user definable attributes per field. Liptak: Changed from 2 to 4 20170718.
Type to hold the attributes of the field/axis/file.
Defines a new field within the given file Example usage:
type(diagyamlfilesvar_type) function, dimension(:), allocatable, public get_diag_fields_entries(indices)
Gets the diag_field entries corresponding to the indices of the sorted variable_list.
integer function, public get_num_unique_fields()
Determine the number of unique diag_fields in the diag_yaml_object.
integer function, dimension(:), allocatable, public find_diag_field(diag_field_name, module_name)
Determines if a diag_field is in the diag_yaml_object.
subroutine, public get_domain_and_domain_type(diag_axis, axis_id, domain_type, domain, var_name)
Loop through a variable's axis_id to determine and return the domain type and domain to use.
integer function, dimension(:), allocatable, public get_diag_files_id(indices)
Finds the indices of the diag_yamldiag_files(:) corresponding to fields in variable_list(indices)
subroutine, public get_date(time, year, month, day, hour, minute, second, tick, err_msg)
Gets the date for different calendar types. Given a time_interval, returns the corresponding date und...
Type to represent amounts of time. Implemented as seconds and days to allow for larger intervals.
Type to hold the domain info for an axis This type was created to avoid having to send in "Domain",...
Type to hold the diagnostic axis description.
Type to hold the diag_axis (either subaxis or a full axis)
Type to hold the diagnostic axis description.
Object that holds all variable information.
type to hold the info a diag_field