ESMF_HConfigUtilities.F90 Source File


This file depends on

sourcefile~~esmf_hconfigutilities.f90~~EfferentGraph sourcefile~esmf_hconfigutilities.f90 ESMF_HConfigUtilities.F90 sourcefile~errorhandling.f90 ErrorHandling.F90 sourcefile~esmf_hconfigutilities.f90->sourcefile~errorhandling.f90 sourcefile~mapl_throw.f90 MAPL_Throw.F90 sourcefile~errorhandling.f90->sourcefile~mapl_throw.f90

Files dependent on this one

sourcefile~~esmf_hconfigutilities.f90~~AfferentGraph sourcefile~esmf_hconfigutilities.f90 ESMF_HConfigUtilities.F90 sourcefile~generic3g.f90 Generic3g.F90 sourcefile~generic3g.f90->sourcefile~esmf_hconfigutilities.f90 sourcefile~mapl_hconfigmatch.f90 MAPL_HConfigMatch.F90 sourcefile~mapl_hconfigmatch.f90->sourcefile~esmf_hconfigutilities.f90 sourcefile~test_hconfigmatch.pf Test_HConfigMatch.pf sourcefile~test_hconfigmatch.pf->sourcefile~esmf_hconfigutilities.f90 sourcefile~test_writeyaml.pf Test_WriteYaml.pf sourcefile~test_writeyaml.pf->sourcefile~esmf_hconfigutilities.f90 sourcefile~write_hconfig.f90 write_hconfig.F90 sourcefile~write_hconfig.f90->sourcefile~esmf_hconfigutilities.f90 sourcefile~cap.f90 Cap.F90 sourcefile~cap.f90->sourcefile~generic3g.f90 sourcefile~capgridcomp.f90 CapGridComp.F90 sourcefile~cap.f90->sourcefile~capgridcomp.f90 sourcefile~capgridcomp.f90->sourcefile~generic3g.f90 sourcefile~configurableleafgridcomp.f90 ConfigurableLeafGridComp.F90 sourcefile~configurableleafgridcomp.f90->sourcefile~generic3g.f90 sourcefile~configurableparentgridcomp.f90 ConfigurableParentGridComp.F90 sourcefile~configurableparentgridcomp.f90->sourcefile~generic3g.f90 sourcefile~extdatagridcomp.f90 ExtDataGridComp.F90 sourcefile~extdatagridcomp.f90->sourcefile~generic3g.f90 sourcefile~historycollectiongridcomp.f90 HistoryCollectionGridComp.F90 sourcefile~historycollectiongridcomp.f90->sourcefile~generic3g.f90 sourcefile~historycollectiongridcomp_private.f90 HistoryCollectionGridComp_private.F90 sourcefile~historycollectiongridcomp.f90->sourcefile~historycollectiongridcomp_private.f90 sourcefile~historycollectiongridcomp_private.f90->sourcefile~generic3g.f90 sourcefile~historygridcomp.f90 HistoryGridComp.F90 sourcefile~historygridcomp.f90->sourcefile~generic3g.f90 sourcefile~historygridcomp.f90->sourcefile~historycollectiongridcomp.f90 sourcefile~mapl3g.f90 mapl3g.F90 sourcefile~mapl3g.f90->sourcefile~generic3g.f90 sourcefile~mapl3g.f90->sourcefile~cap.f90 sourcefile~test_extdatagridcomp.pf Test_ExtDataGridComp.pf sourcefile~test_extdatagridcomp.pf->sourcefile~generic3g.f90 sourcefile~test_historygridcomp.pf Test_HistoryGridComp.pf sourcefile~test_historygridcomp.pf->sourcefile~generic3g.f90 sourcefile~geos.f90 GEOS.F90 sourcefile~geos.f90->sourcefile~mapl3g.f90 sourcefile~test_historycollectiongridcomp.pf Test_HistoryCollectionGridComp.pf sourcefile~test_historycollectiongridcomp.pf->sourcefile~historycollectiongridcomp_private.f90

Source Code

#include "MAPL_Generic.h"

module mapl3g_ESMF_HConfigUtilities
   use esmf
   use mapl_ErrorHandling
   implicit none
   private

   public :: write(formatted)
   public :: MAPL_HConfigMatch

   character(*), parameter :: CORE_SCHEMA_INT_TAG = 'tag:yaml.org,2002:int'
   character(*), parameter :: CORE_SCHEMA_FLOAT_TAG = 'tag:yaml.org,2002:float'
   character(*), parameter :: CORE_SCHEMA_STR_TAG = 'tag:yaml.org,2002:str'
   character(*), parameter :: CORE_SCHEMA_BOOL_TAG = 'tag:yaml.org,2002:bool'

   interface write(formatted)
      procedure write_hconfig
   end interface write(formatted)

   INTERFACE
      module subroutine write_hconfig(hconfig, unit, iotype, v_list, iostat, iomsg)
         type(ESMF_Hconfig), intent(in) :: hconfig
         integer, intent(in) :: unit
         character(*), intent(in) :: iotype
         integer, intent(in) :: v_list(:)
         integer, intent(out) :: iostat 
         character(*), intent(inout) :: iomsg
      end subroutine write_hconfig

      module function MAPL_HConfigMatch(a, b, rc) result(match)
         logical :: match
         type(ESMF_HConfig), intent(in) :: a, b
         integer, optional, intent(out) :: rc
      end function MAPL_HConfigMatch

   END INTERFACE

end module mapl3g_ESMF_HConfigUtilities