Interp.F90 Source File


Files dependent on this one

sourcefile~~interp.f90~~AfferentGraph sourcefile~interp.f90 Interp.F90 sourcefile~base.f90 Base.F90 sourcefile~base.f90->sourcefile~interp.f90 sourcefile~interp_implementation.f90 Interp_implementation.F90 sourcefile~interp_implementation.f90->sourcefile~interp.f90 sourcefile~maplshared.f90 MaplShared.F90 sourcefile~maplshared.f90->sourcefile~interp.f90 sourcefile~extdataroot_gridcomp.f90 ExtDataRoot_GridComp.F90 sourcefile~extdataroot_gridcomp.f90->sourcefile~maplshared.f90 sourcefile~mapl.f90 MAPL.F90 sourcefile~extdataroot_gridcomp.f90->sourcefile~mapl.f90 sourcefile~mapl.f90->sourcefile~base.f90 sourcefile~mapl_generic.f90 MAPL_Generic.F90 sourcefile~mapl.f90->sourcefile~mapl_generic.f90 sourcefile~mapl_generic.f90->sourcefile~maplshared.f90 sourcefile~mapl_nuopcwrappermod.f90 MAPL_NUOPCWrapperMod.F90 sourcefile~mapl_nuopcwrappermod.f90->sourcefile~base.f90 sourcefile~test_cfio_bundle.pf Test_CFIO_Bundle.pf sourcefile~test_cfio_bundle.pf->sourcefile~base.f90 sourcefile~tstqsat.f90 tstqsat.F90 sourcefile~tstqsat.f90->sourcefile~base.f90 sourcefile~ut_extdata.f90 ut_ExtData.F90 sourcefile~ut_extdata.f90->sourcefile~base.f90 sourcefile~utcfio_bundle.f90 utCFIO_Bundle.F90 sourcefile~utcfio_bundle.f90->sourcefile~base.f90 sourcefile~comp_testing_driver.f90 Comp_Testing_Driver.F90 sourcefile~comp_testing_driver.f90->sourcefile~mapl.f90 sourcefile~comp_testing_driver.f90->sourcefile~mapl_generic.f90 sourcefile~extdatadriver.f90 ExtDataDriver.F90 sourcefile~extdatadriver.f90->sourcefile~extdataroot_gridcomp.f90 sourcefile~extdatadriver.f90->sourcefile~mapl.f90 sourcefile~extdatadrivergridcomp.f90 ExtDataDriverGridComp.F90 sourcefile~extdatadrivergridcomp.f90->sourcefile~mapl.f90 sourcefile~extdatadrivermod.f90 ExtDataDriverMod.F90 sourcefile~extdatadrivermod.f90->sourcefile~extdataroot_gridcomp.f90 sourcefile~extdatadrivermod.f90->sourcefile~mapl.f90 sourcefile~extdatagridcompmod.f90 ExtDataGridCompMod.F90 sourcefile~extdatagridcompmod.f90->sourcefile~mapl_generic.f90 sourcefile~extdatagridcompng.f90 ExtDataGridCompNG.F90 sourcefile~extdatagridcompng.f90->sourcefile~mapl_generic.f90 sourcefile~mapl_capgridcomp.f90 MAPL_CapGridComp.F90 sourcefile~mapl_capgridcomp.f90->sourcefile~mapl_generic.f90 sourcefile~mapl_demo_fargparse.f90 MAPL_demo_fargparse.F90 sourcefile~mapl_demo_fargparse.f90->sourcefile~mapl.f90 sourcefile~mapl_geosatmaskmod.f90 MAPL_GeosatMaskMod.F90 sourcefile~mapl_geosatmaskmod.f90->sourcefile~mapl_generic.f90 sourcefile~mapl_historycollection.f90 MAPL_HistoryCollection.F90 sourcefile~mapl_historycollection.f90->sourcefile~mapl_generic.f90 sourcefile~mapl_historygridcomp.f90 MAPL_HistoryGridComp.F90 sourcefile~mapl_historygridcomp.f90->sourcefile~mapl_generic.f90 sourcefile~mapl_orbgridcompmod.f90 MAPL_OrbGridCompMod.F90 sourcefile~mapl_orbgridcompmod.f90->sourcefile~mapl_generic.f90 sourcefile~mapl_stationsamplermod.f90 MAPL_StationSamplerMod.F90 sourcefile~mapl_stationsamplermod.f90->sourcefile~mapl_generic.f90 sourcefile~mapl_trajectorymod.f90 MAPL_TrajectoryMod.F90 sourcefile~mapl_trajectorymod.f90->sourcefile~mapl_generic.f90 sourcefile~pfio_mapl_demo.f90 pfio_MAPL_demo.F90 sourcefile~pfio_mapl_demo.f90->sourcefile~mapl.f90 sourcefile~regrid_util.f90 Regrid_Util.F90 sourcefile~regrid_util.f90->sourcefile~mapl.f90 sourcefile~time_ave_util.f90 time_ave_util.F90 sourcefile~time_ave_util.f90->sourcefile~mapl.f90 sourcefile~varspecdescription.f90 VarspecDescription.F90 sourcefile~varspecdescription.f90->sourcefile~mapl.f90

Source Code

module MAPL_InterpMod

  use, intrinsic :: iso_fortran_env, only: REAL64

  implicit none
  private

  public MAPL_Interp

  interface MAPL_Interp
     module procedure INTERP_LIN_0011_1
     module procedure INTERP_LIN_0011_2
     module procedure INTERP_LIN_1111_1
     module procedure INTERP_LIN_1111_2
     module procedure INTERP_LIN_2111_1
     module procedure INTERP_LIN_2111_2
     module procedure INTERP_LIN_2121_1
     module procedure INTERP_LIN_2121_2
     module procedure INTERP_LIN_3321_1
     module procedure INTERP_LIN_3321_2
  end interface MAPL_Interp

  interface 
     module subroutine INTERP_LIN_0011_1( OY, OX, IY, IX)

       ! !ARGUMENTS:

       real,     intent(OUT) :: OY
       real,     intent(IN ) :: OX
       real,     intent(IN ) :: IY(:)
       real,     intent(IN ) :: IX(:)
       !EOP
     end subroutine INTERP_LIN_0011_1

     module subroutine INTERP_LIN_0011_2( OY, OX, IY, IX)

       ! !ARGUMENTS:

       real(kind=REAL64),     intent(OUT) :: OY
       real(kind=REAL64),     intent(IN ) :: OX
       real(kind=REAL64),     intent(IN ) :: IY(:)
       real(kind=REAL64),     intent(IN ) :: IX(:)
       !EOP
     end subroutine INTERP_LIN_0011_2

     !=========================================================================

     module subroutine INTERP_LIN_1111_1( OY, OX, IY, IX)

       real,     intent(OUT) :: OY(:)
       real,     intent(IN ) :: OX(:)
       real,     intent(IN ) :: IY(:)
       real,     intent(IN ) :: IX(:)
     end subroutine INTERP_LIN_1111_1

     !=========================================================================

     module subroutine INTERP_LIN_1111_2( OY, OX, IY, IX)

       real(kind=REAL64),     intent(OUT) :: OY(:)
       real(kind=REAL64),     intent(IN ) :: OX(:)
       real(kind=REAL64),     intent(IN ) :: IY(:)
       real(kind=REAL64),     intent(IN ) :: IX(:)
     end subroutine INTERP_LIN_1111_2

     !=========================================================================

     module subroutine INTERP_LIN_2121_1( OY, OX, IY, IX)
       real,     intent(OUT) :: OY(:,:)
       real,     intent(IN ) :: OX(:)
       real,     intent(IN ) :: IY(:,:)
       real,     intent(IN ) :: IX(:)
     end subroutine INTERP_LIN_2121_1

     !=========================================================================

     module subroutine INTERP_LIN_2121_2( OY, OX, IY, IX)
       real(kind=REAL64),     intent(OUT) :: OY(:,:)
       real(kind=REAL64),     intent(IN ) :: OX(:)
       real(kind=REAL64),     intent(IN ) :: IY(:,:)
       real(kind=REAL64),     intent(IN ) :: IX(:)
     end subroutine INTERP_LIN_2121_2

     !=========================================================================

     module subroutine INTERP_LIN_2111_1( OY, OX, IY, IX)

       real,     intent(OUT) :: OY(:,:)
       real,     intent(IN ) :: OX(:)
       real,     intent(IN ) :: IY(:)
       real,     intent(IN ) :: IX(:)
     end subroutine INTERP_LIN_2111_1

     !=========================================================================

     module subroutine INTERP_LIN_2111_2( OY, OX, IY, IX)

       real(kind=REAL64),     intent(OUT) :: OY(:,:)
       real(kind=REAL64),     intent(IN ) :: OX(:)
       real(kind=REAL64),     intent(IN ) :: IY(:)
       real(kind=REAL64),     intent(IN ) :: IX(:)
     end subroutine INTERP_LIN_2111_2

     !=========================================================================

     module subroutine INTERP_LIN_3321_1( OY, OX, IY, IX)

       real,     intent(OUT) :: OY(:,:,:)
       real,     intent(IN ) :: OX(:,:,:)
       real,     intent(IN ) :: IY(:,:)
       real,     intent(IN ) :: IX(:)
     end subroutine INTERP_LIN_3321_1

     !=========================================================================

     module subroutine INTERP_LIN_3321_2( OY, OX, IY, IX)

       real(kind=REAL64),     intent(OUT) :: OY(:,:,:)
       real(kind=REAL64),     intent(IN ) :: OX(:,:,:)
       real(kind=REAL64),     intent(IN ) :: IY(:,:)
       real(kind=REAL64),     intent(IN ) :: IX(:)
     end subroutine INTERP_LIN_3321_2
  end interface
end module MAPL_InterpMod