nrutil_trim Module

Numerical Recipes Types Utilized in PLUME.


Uses

  • module~~nrutil_trim~~UsesGraph module~nrutil_trim nrutil_trim module~nrtype nrtype module~nrutil_trim->module~nrtype

Used by

  • module~~nrutil_trim~~UsedByGraph module~nrutil_trim nrutil_trim proc~bessim bessim proc~bessim->module~nrutil_trim proc~bessim0 bessim0 proc~bessim0->module~nrutil_trim proc~bessim1 bessim1 proc~bessim1->module~nrutil_trim

Variables

Type Visibility Attributes Name Initial
integer(kind=I4B), public, parameter :: NPAR_ARTH = 16
integer(kind=I4B), public, parameter :: NPAR2_ARTH = 8
integer(kind=I4B), public, parameter :: NPAR_GEOP = 4
integer(kind=I4B), public, parameter :: NPAR2_GEOP = 2
integer(kind=I4B), public, parameter :: NPAR_CUMSUM = 16
integer(kind=I4B), public, parameter :: NPAR_CUMPROD = 8
integer(kind=I4B), public, parameter :: NPAR_POLY = 8
integer(kind=I4B), public, parameter :: NPAR_POLYTERM = 8

Interfaces

public interface assert

  • public subroutine assert1(n1, string)

    Arguments

    Type IntentOptional Attributes Name
    logical, intent(in) :: n1
    character(len=*), intent(in) :: string
  • public subroutine assert2(n1, n2, string)

    Arguments

    Type IntentOptional Attributes Name
    logical, intent(in) :: n1
    logical, intent(in) :: n2
    character(len=*), intent(in) :: string
  • public subroutine assert3(n1, n2, n3, string)

    Arguments

    Type IntentOptional Attributes Name
    logical, intent(in) :: n1
    logical, intent(in) :: n2
    logical, intent(in) :: n3
    character(len=*), intent(in) :: string
  • public subroutine assert4(n1, n2, n3, n4, string)

    Arguments

    Type IntentOptional Attributes Name
    logical, intent(in) :: n1
    logical, intent(in) :: n2
    logical, intent(in) :: n3
    logical, intent(in) :: n4
    character(len=*), intent(in) :: string
  • public subroutine assert_v(n, string)

    Arguments

    Type IntentOptional Attributes Name
    logical, intent(in), DIMENSION(:) :: n
    character(len=*), intent(in) :: string

public interface poly

  • public function poly_rr(x, coeffs)

    Arguments

    Type IntentOptional Attributes Name
    real(kind=SP), intent(in) :: x
    real(kind=SP), intent(in), DIMENSION(:) :: coeffs

    Return Value real(kind=SP)

  • public function poly_rrv(x, coeffs)

    Arguments

    Type IntentOptional Attributes Name
    real(kind=SP), intent(in), DIMENSION(:) :: x
    real(kind=SP), intent(in), DIMENSION(:) :: coeffs

    Return Value real(kind=SP), DIMENSION(size(x))

  • public function poly_dd(x, coeffs)

    Arguments

    Type IntentOptional Attributes Name
    real(kind=DP), intent(in) :: x
    real(kind=DP), intent(in), DIMENSION(:) :: coeffs

    Return Value real(kind=DP)

  • public function poly_ddv(x, coeffs)

    Arguments

    Type IntentOptional Attributes Name
    real(kind=DP), intent(in), DIMENSION(:) :: x
    real(kind=DP), intent(in), DIMENSION(:) :: coeffs

    Return Value real(kind=DP), DIMENSION(size(x))

  • public function poly_rc(x, coeffs)

    Arguments

    Type IntentOptional Attributes Name
    complex(kind=SPC), intent(in) :: x
    real(kind=SP), intent(in), DIMENSION(:) :: coeffs

    Return Value complex(kind=SPC)

  • public function poly_cc(x, coeffs)

    Arguments

    Type IntentOptional Attributes Name
    complex(kind=SPC), intent(in) :: x
    complex(kind=SPC), intent(in), DIMENSION(:) :: coeffs

    Return Value complex(kind=SPC)

  • public function poly_msk_rrv(x, coeffs, mask)

    Arguments

    Type IntentOptional Attributes Name
    real(kind=SP), intent(in), DIMENSION(:) :: x
    real(kind=SP), intent(in), DIMENSION(:) :: coeffs
    logical(kind=LGT), intent(in), DIMENSION(:) :: mask

    Return Value real(kind=SP), DIMENSION(size(x))

  • public function poly_msk_ddv(x, coeffs, mask)

    Arguments

    Type IntentOptional Attributes Name
    real(kind=DP), intent(in), DIMENSION(:) :: x
    real(kind=DP), intent(in), DIMENSION(:) :: coeffs
    logical(kind=LGT), intent(in), DIMENSION(:) :: mask

    Return Value real(kind=DP), DIMENSION(size(x))


Functions

public function poly_rr(x, coeffs)

Arguments

Type IntentOptional Attributes Name
real(kind=SP), intent(in) :: x
real(kind=SP), intent(in), DIMENSION(:) :: coeffs

Return Value real(kind=SP)

public function poly_dd(x, coeffs)

Arguments

Type IntentOptional Attributes Name
real(kind=DP), intent(in) :: x
real(kind=DP), intent(in), DIMENSION(:) :: coeffs

Return Value real(kind=DP)

public function poly_rc(x, coeffs)

Arguments

Type IntentOptional Attributes Name
complex(kind=SPC), intent(in) :: x
real(kind=SP), intent(in), DIMENSION(:) :: coeffs

Return Value complex(kind=SPC)

public function poly_cc(x, coeffs)

Arguments

Type IntentOptional Attributes Name
complex(kind=SPC), intent(in) :: x
complex(kind=SPC), intent(in), DIMENSION(:) :: coeffs

Return Value complex(kind=SPC)

public function poly_rrv(x, coeffs)

Arguments

Type IntentOptional Attributes Name
real(kind=SP), intent(in), DIMENSION(:) :: x
real(kind=SP), intent(in), DIMENSION(:) :: coeffs

Return Value real(kind=SP), DIMENSION(size(x))

public function poly_ddv(x, coeffs)

Arguments

Type IntentOptional Attributes Name
real(kind=DP), intent(in), DIMENSION(:) :: x
real(kind=DP), intent(in), DIMENSION(:) :: coeffs

Return Value real(kind=DP), DIMENSION(size(x))

public function poly_msk_rrv(x, coeffs, mask)

Arguments

Type IntentOptional Attributes Name
real(kind=SP), intent(in), DIMENSION(:) :: x
real(kind=SP), intent(in), DIMENSION(:) :: coeffs
logical(kind=LGT), intent(in), DIMENSION(:) :: mask

Return Value real(kind=SP), DIMENSION(size(x))

public function poly_msk_ddv(x, coeffs, mask)

Arguments

Type IntentOptional Attributes Name
real(kind=DP), intent(in), DIMENSION(:) :: x
real(kind=DP), intent(in), DIMENSION(:) :: coeffs
logical(kind=LGT), intent(in), DIMENSION(:) :: mask

Return Value real(kind=DP), DIMENSION(size(x))


Subroutines

public subroutine assert1(n1, string)

Arguments

Type IntentOptional Attributes Name
logical, intent(in) :: n1
character(len=*), intent(in) :: string

public subroutine assert2(n1, n2, string)

Arguments

Type IntentOptional Attributes Name
logical, intent(in) :: n1
logical, intent(in) :: n2
character(len=*), intent(in) :: string

public subroutine assert3(n1, n2, n3, string)

Arguments

Type IntentOptional Attributes Name
logical, intent(in) :: n1
logical, intent(in) :: n2
logical, intent(in) :: n3
character(len=*), intent(in) :: string

public subroutine assert4(n1, n2, n3, n4, string)

Arguments

Type IntentOptional Attributes Name
logical, intent(in) :: n1
logical, intent(in) :: n2
logical, intent(in) :: n3
logical, intent(in) :: n4
character(len=*), intent(in) :: string

public subroutine assert_v(n, string)

Arguments

Type IntentOptional Attributes Name
logical, intent(in), DIMENSION(:) :: n
character(len=*), intent(in) :: string