CptrWrapper.F90 Source File


Files dependent on this one

sourcefile~~cptrwrapper.f90~~AfferentGraph sourcefile~cptrwrapper.f90 CptrWrapper.F90 sourcefile~udsystem.f90 UDSystem.F90 sourcefile~udsystem.f90->sourcefile~cptrwrapper.f90 sourcefile~test_udsystem.pf Test_UDSystem.pf sourcefile~test_udsystem.pf->sourcefile~udsystem.f90 sourcefile~udunits2f.f90 udunits2f.F90 sourcefile~test_udsystem.pf->sourcefile~udunits2f.f90 sourcefile~test_udunits2f.pf Test_udunits2f.pf sourcefile~test_udunits2f.pf->sourcefile~udsystem.f90 sourcefile~test_udunits2f.pf->sourcefile~udunits2f.f90 sourcefile~udunits2f.f90->sourcefile~udsystem.f90 sourcefile~convertunitsaction.f90 ConvertUnitsAction.F90 sourcefile~convertunitsaction.f90->sourcefile~udunits2f.f90 sourcefile~fieldspec.f90~2 FieldSpec.F90 sourcefile~fieldspec.f90~2->sourcefile~udunits2f.f90 sourcefile~fieldspec.f90~2->sourcefile~convertunitsaction.f90 sourcefile~fieldunits.f90 FieldUnits.F90 sourcefile~fieldunits.f90->sourcefile~udunits2f.f90 sourcefile~mapl_initialize.f90 MAPL_Initialize.F90 sourcefile~mapl_initialize.f90->sourcefile~udunits2f.f90 sourcefile~bracketspec.f90 BracketSpec.F90 sourcefile~bracketspec.f90->sourcefile~fieldspec.f90~2 sourcefile~make_itemspec.f90 make_itemSpec.F90 sourcefile~make_itemspec.f90->sourcefile~fieldspec.f90~2 sourcefile~modelverticalgrid.f90 ModelVerticalGrid.F90 sourcefile~modelverticalgrid.f90->sourcefile~fieldspec.f90~2 sourcefile~test_addfieldspec.pf Test_AddFieldSpec.pf sourcefile~test_addfieldspec.pf->sourcefile~fieldspec.f90~2 sourcefile~test_bracketspec.pf Test_BracketSpec.pf sourcefile~test_bracketspec.pf->sourcefile~fieldspec.f90~2 sourcefile~test_fieldinfo.pf Test_FieldInfo.pf sourcefile~test_fieldinfo.pf->sourcefile~fieldspec.f90~2 sourcefile~test_fieldspec.pf Test_FieldSpec.pf sourcefile~test_fieldspec.pf->sourcefile~fieldspec.f90~2

Source Code

module ud2f_CptrWrapper
   use, intrinsic :: iso_c_binding, only: c_ptr, C_NULL_PTR, c_associated
   implicit none
   private

   public :: CptrWrapper

!================================ CPTRWRAPPER ==================================
! Base class to wrap type(c_ptr) instances used for udunits2 objects that cannot 
! interface directly to fortran. Each extended class must provide a subroutine
! to free the memory associated with cptr_
   type, abstract :: CptrWrapper
      private
      type(c_ptr) :: cptr_ = C_NULL_PTR
   contains
      procedure :: get_cptr
      procedure :: set_cptr
      procedure :: is_free
      procedure :: free
      procedure(I_free_memory), deferred :: free_memory
   end type CptrWrapper

   abstract interface

      subroutine I_free_memory(this)
         import :: CptrWrapper
         class(CptrWrapper), intent(in) :: this
      end subroutine I_Free_Memory

   end interface

contains

   type(c_ptr) function get_cptr(this)
      class(CptrWrapper), intent(in) :: this

      get_cptr = this%cptr_

   end function get_cptr

   subroutine set_cptr(this, cptr)
      class(CptrWrapper), intent(inout) :: this
      type(c_ptr), intent(in) :: cptr
      this%cptr_ = cptr
   end subroutine set_cptr

   logical function is_free(this)
      class(CptrWrapper), intent(in) :: this

      is_free = .not. c_associated(this%cptr_)

   end function is_free

   ! Free up memory pointed to by cptr_ and set cptr_ to c_null_ptr
   subroutine free(this)
      class(CptrWrapper), intent(inout) :: this

      if(this%is_free()) return
      call this%free_memory()
      this%cptr_ = c_null_ptr

   end subroutine free

end module ud2f_CptrWrapper