StateGet.F90 Source File


This file depends on

sourcefile~~stateget.f90~~EfferentGraph sourcefile~stateget.f90 StateGet.F90 sourcefile~errorhandling.f90 ErrorHandling.F90 sourcefile~stateget.f90->sourcefile~errorhandling.f90 sourcefile~mapl_throw.f90 MAPL_Throw.F90 sourcefile~errorhandling.f90->sourcefile~mapl_throw.f90

Files dependent on this one

sourcefile~~stateget.f90~~AfferentGraph sourcefile~stateget.f90 StateGet.F90 sourcefile~restarthandler.f90 RestartHandler.F90 sourcefile~restarthandler.f90->sourcefile~stateget.f90 sourcefile~read_restart.f90~2 read_restart.F90 sourcefile~read_restart.f90~2->sourcefile~restarthandler.f90 sourcefile~write_restart.f90 write_restart.F90 sourcefile~write_restart.f90->sourcefile~restarthandler.f90

Source Code

#include "MAPL_Generic.h"

module mapl3g_StateGet

   use mapl_ErrorHandling
   use esmf

   implicit none
   private

   public :: MAPL_StateGet

   interface MAPL_StateGet
      procedure get_bundle_from_state_
   end interface MAPL_StateGet

contains

   type(ESMF_FieldBundle) function get_bundle_from_state_(state, rc) result(bundle)
      type(ESMF_State), intent(in) :: state
      integer, optional, intent(out) :: rc

      character(len=ESMF_MAXSTR), allocatable :: item_name(:)
      type (ESMF_StateItem_Flag), allocatable  :: item_type(:)
      type(ESMF_Field) :: field
      type(ESMF_FieldStatus_Flag) :: field_status
      integer :: item_count, idx, status

      ! bundle to pack fields in
      bundle = ESMF_FieldBundleCreate(_RC)
      call ESMF_StateGet(state, itemCount=item_count, _RC)
      allocate(item_name(item_count), _STAT)
      allocate(item_type(item_count), _STAT)
      call ESMF_StateGet(state, itemNameList=item_name, itemTypeList=item_type, _RC)
      do idx = 1, item_count
         if (item_type(idx) /= ESMF_STATEITEM_FIELD) then
            _FAIL("FieldBundle has not been implemented yet")
         end if
         call ESMF_StateGet(state, item_name(idx), field, _RC)
         call ESMF_FieldGet(field, status=field_status, _RC)
         if (field_status == ESMF_FIELDSTATUS_COMPLETE) then
            call ESMF_FieldBundleAdd(bundle, [field], _RC)
         end if
      end do
      deallocate(item_name, item_type, _STAT)

      _RETURN(_SUCCESS)
   end function get_bundle_from_state_

end module mapl3g_StateGet