supports_metadata.F90 Source File


This file depends on

sourcefile~~supports_metadata.f90~3~~EfferentGraph sourcefile~supports_metadata.f90~3 supports_metadata.F90 sourcefile~errorhandling.f90 ErrorHandling.F90 sourcefile~supports_metadata.f90~3->sourcefile~errorhandling.f90 sourcefile~lonaxis.f90 LonAxis.F90 sourcefile~supports_metadata.f90~3->sourcefile~lonaxis.f90 sourcefile~mapl_range.f90 MAPL_Range.F90 sourcefile~supports_metadata.f90~3->sourcefile~mapl_range.f90 sourcefile~mapl_throw.f90 MAPL_Throw.F90 sourcefile~errorhandling.f90->sourcefile~mapl_throw.f90 sourcefile~coordinateaxis.f90 CoordinateAxis.F90 sourcefile~lonaxis.f90->sourcefile~coordinateaxis.f90 sourcefile~pfio.f90 pFIO.F90 sourcefile~lonaxis.f90->sourcefile~pfio.f90 sourcefile~mapl_exceptionhandling.f90 MAPL_ExceptionHandling.F90 sourcefile~mapl_range.f90->sourcefile~mapl_exceptionhandling.f90

Source Code

#include "MAPL_ErrLog.h"

submodule (mapl3g_LonAxis) supports_metadata_smod
   use mapl_RangeMod
   use mapl_ErrorHandling
   use esmf
   implicit none (type, external)
   integer, parameter :: R8 = ESMF_KIND_R8

contains

   logical module function supports_metadata(file_metadata, rc) result(supports)
      type(FileMetadata), intent(in) :: file_metadata
      integer, optional, intent(out) :: rc

      integer :: status
      character(:), allocatable :: dim_name

      supports = .true.
      dim_name = get_dim_name(file_metadata, units='degrees_east', _RC)

      supports = (dim_name /= '')
      _RETURN(_SUCCESS)
   end function supports_metadata

end submodule supports_metadata_smod