ESMF_LocalArray.F90 Source File


Files dependent on this one

sourcefile~~esmf_localarray.f90~~AfferentGraph sourcefile~esmf_localarray.f90 ESMF_LocalArray.F90 sourcefile~esmf.f90 ESMF.F90 sourcefile~esmf.f90->sourcefile~esmf_localarray.f90 sourcefile~esmf_array.f90 ESMF_Array.F90 sourcefile~esmf_array.f90->sourcefile~esmf_localarray.f90 sourcefile~esmf_arrayha.f90 ESMF_ArrayHa.F90 sourcefile~esmf_arrayha.f90->sourcefile~esmf_localarray.f90 sourcefile~esmf_field.f90 ESMF_Field.F90 sourcefile~esmf_field.f90->sourcefile~esmf_localarray.f90 sourcefile~esmf_fieldgetallocbounds.f90 ESMF_FieldGetAllocBounds.F90 sourcefile~esmf_fieldgetallocbounds.f90->sourcefile~esmf_localarray.f90 sourcefile~esmf_fieldpr.f90 ESMF_FieldPr.F90 sourcefile~esmf_fieldpr.f90->sourcefile~esmf_localarray.f90 sourcefile~esmf_fieldset.f90 ESMF_FieldSet.F90 sourcefile~esmf_fieldset.f90->sourcefile~esmf_localarray.f90 sourcefile~esmf_grid.f90 ESMF_Grid.F90 sourcefile~esmf_grid.f90->sourcefile~esmf_localarray.f90 sourcefile~esmf_localarray_c.f90 ESMF_LocalArray_C.F90 sourcefile~esmf_localarray_c.f90->sourcefile~esmf_localarray.f90 sourcefile~esmf_localarrayutest.f90 ESMF_LocalArrayUTest.F90 sourcefile~esmf_localarrayutest.f90->sourcefile~esmf_localarray.f90 sourcefile~esmf_locstream.f90 ESMF_LocStream.F90 sourcefile~esmf_locstream.f90->sourcefile~esmf_localarray.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_LocalArray.F90"
!==============================================================================
!
! ESMF LocalArray module
module ESMF_LocalArrayMod
!
!==============================================================================
!
! This file contains the sub modules for LocalArray class definition and methods
!
!------------------------------------------------------------------------------
! INCLUDES
#include "ESMF.h"

  use ESMF_LocalArrayCreateMod
  use ESMF_LocalArrayGetMod

#ifndef ESMF_NO_F2018ASSUMEDTYPE
  public c_esmf_f90ptrsizeprint
#endif
  
!------------------------------------------------------------------------------
! ! Interoperability interfaces

#ifndef ESMF_NO_F2018ASSUMEDTYPE

  interface

    subroutine c_esmf_f90ptrsizeprint(p1, p2, rank, rc)
      type(*)       :: p1(*)
      type(*)       :: p2(*)
      integer       :: rank
      integer       :: rc
    end subroutine

  end interface

#endif

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

end module ESMF_LocalArrayMod