SubTab_sngl Subroutine

public subroutine SubTab_sngl(x, Nx)

Subtabulate array x, creating interpolated array of length Nx

Arguments

Type IntentOptional Attributes Name
real, intent(inout) :: x(Nx)
integer, intent(in) :: Nx

Called by

proc~~subtab_sngl~~CalledByGraph proc~subtab_sngl SubTab_sngl interface~subtab SubTab interface~subtab->proc~subtab_sngl proc~readati3d ReadATI3D proc~readati3d->interface~subtab proc~readbty3d ReadBTY3D proc~readbty3d->interface~subtab proc~readfreqvec ReadfreqVec proc~readfreqvec->interface~subtab proc~readraybearingangles ReadRayBearingAngles proc~readraybearingangles->interface~subtab proc~readrayelevationangles ReadRayElevationAngles proc~readrayelevationangles->interface~subtab proc~readvector ReadVector proc~readvector->interface~subtab proc~readenvironment ReadEnvironment proc~readenvironment->proc~readfreqvec proc~readenvironment->proc~readraybearingangles proc~readenvironment->proc~readrayelevationangles proc~readrcvrbearings ReadRcvrBearings proc~readenvironment->proc~readrcvrbearings proc~readrcvrranges ReadRcvrRanges proc~readenvironment->proc~readrcvrranges proc~readsxsy ReadSxSy proc~readenvironment->proc~readsxsy proc~readszrz ReadSzRz proc~readenvironment->proc~readszrz proc~readrcvrbearings->proc~readvector proc~readrcvrranges->proc~readvector proc~readsxsy->proc~readvector proc~readszrz->proc~readvector program~bellhop3d BELLHOP3D program~bellhop3d->proc~readati3d program~bellhop3d->proc~readbty3d program~bellhop3d->proc~readenvironment program~bellhop BELLHOP program~bellhop->proc~readenvironment

Source Code

  SUBROUTINE SubTab_sngl( x, Nx )
  !! Subtabulate array `x`, creating interpolated array of length `Nx`

    INTEGER, INTENT( IN )    :: Nx
    REAL,    INTENT( INOUT ) :: x( Nx )
    REAL                     :: deltax

    IF ( Nx >= 3 ) THEN
       IF ( ABS( x( 3 ) - ( -999.9 ) ) < 0.01 ) THEN
          IF ( ABS( x( 2 ) - ( -999.9 ) ) < 0.01 ) x( 2 ) = x( 1 )
          deltax      = ( x( 2 ) - x( 1 ) ) / ( Nx - 1 )
          x( 1 : Nx ) = x( 1 ) + [ ( ix, ix = 0, Nx - 1 ) ] * deltax
       END IF
    END IF

  END SUBROUTINE SubTab_sngl