WrapArray.F90 Source File


Files dependent on this one

sourcefile~~wraparray.f90~~AfferentGraph sourcefile~wraparray.f90 WrapArray.F90 sourcefile~pflogger_stub.f90 pflogger_stub.F90 sourcefile~pflogger_stub.f90->sourcefile~wraparray.f90 sourcefile~applicationsupport.f90 ApplicationSupport.F90 sourcefile~applicationsupport.f90->sourcefile~pflogger_stub.f90 sourcefile~basecomponent.f90 BaseComponent.F90 sourcefile~basecomponent.f90->sourcefile~pflogger_stub.f90 sourcefile~extdatagridcompmod.f90 ExtDataGridCompMod.F90 sourcefile~extdatagridcompmod.f90->sourcefile~pflogger_stub.f90 sourcefile~extdatagridcompng.f90 ExtDataGridCompNG.F90 sourcefile~extdatagridcompng.f90->sourcefile~pflogger_stub.f90 sourcefile~extdatalgr.f90 ExtDataLgr.F90 sourcefile~extdatalgr.f90->sourcefile~pflogger_stub.f90 sourcefile~mapl_cap.f90 MAPL_Cap.F90 sourcefile~mapl_cap.f90->sourcefile~pflogger_stub.f90 sourcefile~mapl_capgridcomp.f90 MAPL_CapGridComp.F90 sourcefile~mapl_capgridcomp.f90->sourcefile~pflogger_stub.f90 sourcefile~mapl_generic.f90 MAPL_Generic.F90 sourcefile~mapl_generic.f90->sourcefile~pflogger_stub.f90 sourcefile~mapl_historygridcomp.f90 MAPL_HistoryGridComp.F90 sourcefile~mapl_historygridcomp.f90->sourcefile~pflogger_stub.f90 sourcefile~mapl_historytrajectorymod_smod.f90 MAPL_HistoryTrajectoryMod_smod.F90 sourcefile~mapl_historytrajectorymod_smod.f90->sourcefile~pflogger_stub.f90 sourcefile~mapl_initialize.f90 MAPL_Initialize.F90 sourcefile~mapl_initialize.f90->sourcefile~pflogger_stub.f90 sourcefile~mapl_nuopcwrappermod.f90 MAPL_NUOPCWrapperMod.F90 sourcefile~mapl_nuopcwrappermod.f90->sourcefile~pflogger_stub.f90 sourcefile~mapl_stationsamplermod.f90 MAPL_StationSamplerMod.F90 sourcefile~mapl_stationsamplermod.f90->sourcefile~pflogger_stub.f90 sourcefile~mapl_sun_uc.f90 MAPL_sun_uc.F90 sourcefile~mapl_sun_uc.f90->sourcefile~pflogger_stub.f90 sourcefile~maplcomponent.f90 MaplComponent.F90 sourcefile~maplcomponent.f90->sourcefile~pflogger_stub.f90 sourcefile~maplgenericcomponent.f90 MaplGenericComponent.F90 sourcefile~maplgenericcomponent.f90->sourcefile~pflogger_stub.f90 sourcefile~maplgrid.f90 MaplGrid.F90 sourcefile~maplgrid.f90->sourcefile~pflogger_stub.f90 sourcefile~multigroupserver.f90 MultiGroupServer.F90 sourcefile~multigroupserver.f90->sourcefile~pflogger_stub.f90 sourcefile~pfio_ctest_io.f90 pfio_ctest_io.F90 sourcefile~pfio_ctest_io.f90->sourcefile~pflogger_stub.f90 sourcefile~pfio_performance.f90 pfio_performance.F90 sourcefile~pfio_performance.f90->sourcefile~pflogger_stub.f90 sourcefile~shmem_implementation.f90 Shmem_implementation.F90 sourcefile~shmem_implementation.f90->sourcefile~pflogger_stub.f90 sourcefile~simulationtime.f90 SimulationTime.F90 sourcefile~simulationtime.f90->sourcefile~pflogger_stub.f90 sourcefile~statespecification.f90 StateSpecification.F90 sourcefile~statespecification.f90->sourcefile~pflogger_stub.f90 sourcefile~varconn.f90 VarConn.F90 sourcefile~varconn.f90->sourcefile~pflogger_stub.f90 sourcefile~varspec.f90 VarSpec.F90 sourcefile~varspec.f90->sourcefile~pflogger_stub.f90 sourcefile~varspecmiscmod.f90 VarSpecMiscMod.F90 sourcefile~varspecmiscmod.f90->sourcefile~pflogger_stub.f90

Source Code

#include "unused_dummy.H"
module PFL_WrapArray
   implicit none
   private

   public :: wrapArray
   public :: WrapArray1d
   public :: WrapArray2d
   public :: WrapArray3d
   public :: WrapArray4d
   public :: WrapArray5d
   
   type :: WrapArray1d
      integer ::placeholder
   end type WrapArray1d

   type :: WrapArray2d
      integer ::placeholder
   end type WrapArray2d

   type :: WrapArray3d
      integer ::placeholder
   end type WrapArray3d

   type :: WrapArray4d
      integer ::placeholder
   end type WrapArray4d

   type :: WrapArray5d
      integer ::placeholder
   end type WrapArray5d

   interface wrapArray
      module procedure wrap1d
      module procedure wrap2d
      module procedure wrap3d
      module procedure wrap4d
      module procedure wrap5d
   end interface wrapArray

contains


   function wrap1d(array) result(wrapper)
      type (WrapArray1d) :: wrapper
      class (*), intent(in) :: array(:)
      wrapper%placeholder = 0
      _UNUSED_DUMMY(array)
   end function wrap1d

   function wrap2d(array) result(wrapper)
      type (WrapArray2d) :: wrapper
      class (*), intent(in) :: array(:,:)
      wrapper%placeholder = 0
      _UNUSED_DUMMY(array)
   end function wrap2d

   function wrap3d(array) result(wrapper)
      type (WrapArray3d) :: wrapper
      class (*), intent(in) :: array(:,:,:)
      wrapper%placeholder = 0
      _UNUSED_DUMMY(array)
   end function wrap3d


   function wrap4d(array) result(wrapper)
      type (WrapArray4d) :: wrapper
      class (*), intent(in) :: array(:,:,:,:)
      wrapper%placeholder = 0
      _UNUSED_DUMMY(array)
   end function wrap4d

   function wrap5d(array) result(wrapper)
      type (WrapArray5d) :: wrapper
      class (*), intent(in) :: array(:,:,:,:,:)
      wrapper%placeholder = 0
      _UNUSED_DUMMY(array)
   end function wrap5d
   
end module PFL_WrapArray