ESMF_State.F90 Source File


Files dependent on this one

sourcefile~~esmf_state.f90~~AfferentGraph sourcefile~esmf_state.f90 ESMF_State.F90 sourcefile~esmf.f90 ESMF.F90 sourcefile~esmf.f90->sourcefile~esmf_state.f90 sourcefile~esmf_attribute.f90 ESMF_Attribute.F90 sourcefile~esmf_attribute.f90->sourcefile~esmf_state.f90 sourcefile~esmf_comp.f90 ESMF_Comp.F90 sourcefile~esmf_comp.f90->sourcefile~esmf_state.f90 sourcefile~esmf_comp_c.f90 ESMF_Comp_C.F90 sourcefile~esmf_comp_c.f90->sourcefile~esmf_state.f90 sourcefile~esmf_cplcomp.f90 ESMF_CplComp.F90 sourcefile~esmf_cplcomp.f90->sourcefile~esmf_state.f90 sourcefile~esmf_gridcomp.f90 ESMF_GridComp.F90 sourcefile~esmf_gridcomp.f90->sourcefile~esmf_state.f90 sourcefile~esmf_infocache.f90 ESMF_InfoCache.F90 sourcefile~esmf_infocache.f90->sourcefile~esmf_state.f90 sourcefile~esmf_infodescribe.f90 ESMF_InfoDescribe.F90 sourcefile~esmf_infodescribe.f90->sourcefile~esmf_state.f90 sourcefile~esmf_infosync.f90 ESMF_InfoSync.F90 sourcefile~esmf_infosync.f90->sourcefile~esmf_state.f90 sourcefile~esmf_namedalias.f90 ESMF_NamedAlias.F90 sourcefile~esmf_namedalias.f90->sourcefile~esmf_state.f90 sourcefile~esmf_state_c.f90 ESMF_State_C.F90 sourcefile~esmf_state_c.f90->sourcefile~esmf_state.f90 sourcefile~esmf_statereconcile.f90 ESMF_StateReconcile.F90 sourcefile~esmf_statereconcile.f90->sourcefile~esmf_state.f90 sourcefile~esmf_webserv.f90 ESMF_WebServ.F90 sourcefile~esmf_webserv.f90->sourcefile~esmf_state.f90 sourcefile~esmf_webservcomponent_c.f90 ESMF_WebServComponent_C.F90 sourcefile~esmf_webservcomponent_c.f90->sourcefile~esmf_state.f90 sourcefile~esmfio.f90 ESMFIO.F90 sourcefile~esmfio.f90->sourcefile~esmf_state.f90

Source Code

! $Id$
!
! Earth System Modeling Framework
! Copyright (c) 2002-2025, University Corporation for Atmospheric Research, 
! Massachusetts Institute of Technology, Geophysical Fluid Dynamics 
! Laboratory, University of Michigan, National Centers for Environmental 
! Prediction, Los Alamos National Laboratory, Argonne National Laboratory, 
! NASA Goddard Space Flight Center.
! Licensed under the University of Illinois-NCSA License.
!==============================================================================
!
#define ESMF_FILENAME "ESMF_State.F90"
!
!     ESMF State module
module ESMF_StateMod
!
!==============================================================================
!
! This file contains the State class definition and all State
! class methods.
!
!------------------------------------------------------------------------------
! INCLUDES
!------------------------------------------------------------------------------
#include "ESMF.h"

!------------------------------------------------------------------------------
!BOPI
! !MODULE: ESMF_StateMod - Data exchange between components
!
! !DESCRIPTION:
!
! The code in this file implements the Fortran function and subroutine 
!  interfaces to the {\tt State} class and associated data structures.
!
!
! !USES:
      use ESMF_StateAPIMod
      use ESMF_StateRemRepMod

      implicit none
      
!------------------------------------------------------------------------------
! !PRIVATE TYPES:
      private
      
!------------------------------------------------------------------------------
! !PUBLIC TYPES:
      public ESMF_State               ! implemented in ESMF_StateTypesMod

!------------------------------------------------------------------------------

! !PUBLIC MEMBER FUNCTIONS:

      public operator(==)
      public operator(/=)

      public ESMF_StateCreate, ESMF_StateDestroy
      public ESMF_StateIsCreated
      
      public ESMF_StateDestruct    ! for ESMF garbage collection

      public ESMF_StateAdd, ESMF_StateAddReplace
      public ESMF_StateGet

      public ESMF_StateLog

      public ESMF_StateRemove
      public ESMF_StateReplace

      public ESMF_StatePrint
      public ESMF_StateSet

      public ESMF_StateSerialize, ESMF_StateDeserialize

      public ESMF_StateClassFindData

      ! These methods are broken and create Arrays in a bad configuration.
      ! We are taking them out so no one uses them. Eventually, new correct 
      ! versions will be implemented.
      !      public ESMF_StateRead
      !      public ESMF_StateWrite
      !      public ESMF_StateWriteRestart
      !      public ESMF_StateReadRestart

      
!EOPI

!------------------------------------------------------------------------------
! The following line turns the CVS identifier string into a printable variable.
      character(*), parameter, private :: version = &
      '$Id$'

!------------------------------------------------------------------------------

end module ESMF_StateMod