stdlib_quadrature 模块

(规范)


使用


接口

公有接口 gauss_legendre

计算高斯-勒让德求积节点和权重。

  • 私有纯模块子程序 gauss_legendre_fp64(x, w, interval)

    参数

    类型 意图可选 属性 名称
    real(kind=dp), intent(out) :: x(:)
    real(kind=dp), intent(out) :: w(:)
    real(kind=dp), intent(in), optional :: interval(2)

公有接口 gauss_legendre_lobatto

计算高斯-勒让德-勒贝格求积节点和权重。

  • 私有纯模块子程序 gauss_legendre_lobatto_fp64(x, w, interval)

    参数

    类型 意图可选 属性 名称
    real(kind=dp), intent(out) :: x(:)
    real(kind=dp), intent(out) :: w(:)
    real(kind=dp), intent(in), optional :: interval(2)

公有接口 simps

使用辛普森法则对采样值进行积分 (规范)

  • 私有纯递归模块函数 simps_dx_dp(y, dx, even) result(integral)

    参数

    类型 意图可选 属性 名称
    real(kind=dp), intent(in), dimension(:) :: y
    real(kind=dp), intent(in) :: dx
    integer, intent(in), optional :: even

    返回值 real(kind=dp)

  • 私有纯递归模块函数 simps_dx_sp(y, dx, even) result(integral)

    参数

    类型 意图可选 属性 名称
    real(kind=sp), intent(in), dimension(:) :: y
    real(kind=sp), intent(in) :: dx
    integer, intent(in), optional :: even

    返回值 real(kind=sp)

  • 私有递归模块函数 simps_x_dp(y, x, even) result(integral)

    参数

    类型 意图可选 属性 名称
    real(kind=dp), intent(in), dimension(:) :: y
    real(kind=dp), intent(in), dimension(:) :: x
    integer, intent(in), optional :: even

    返回值 real(kind=dp)

  • 私有递归模块函数 simps_x_sp(y, x, even) result(integral)

    参数

    类型 意图可选 属性 名称
    real(kind=sp), intent(in), dimension(:) :: y
    real(kind=sp), intent(in), dimension(:) :: x
    integer, intent(in), optional :: even

    返回值 real(kind=sp)

公有接口 simps_weights

使用给定横坐标的梯形法则权重对采样值进行积分 (规范)

  • 私有纯递归模块函数 simps_weights_dp(x, even) result(w)

    参数

    类型 意图可选 属性 名称
    real(kind=dp), intent(in), dimension(:) :: x
    integer, intent(in), optional :: even

    返回值 real(kind=dp), dimension(size(x))

  • 私有纯递归模块函数 simps_weights_sp(x, even) result(w)

    参数

    类型 意图可选 属性 名称
    real(kind=sp), intent(in), dimension(:) :: x
    integer, intent(in), optional :: even

    返回值 real(kind=sp), dimension(size(x))

公有接口 trapz

使用梯形法则对采样值进行积分 (规范)

  • 私有纯模块函数 trapz_dx_dp(y, dx) result(integral)

    参数

    类型 意图可选 属性 名称
    real(kind=dp), intent(in), dimension(:) :: y
    real(kind=dp), intent(in) :: dx

    返回值 real(kind=dp)

  • 私有纯模块函数 trapz_dx_sp(y, dx) result(integral)

    参数

    类型 意图可选 属性 名称
    real(kind=sp), intent(in), dimension(:) :: y
    real(kind=sp), intent(in) :: dx

    返回值 real(kind=sp)

  • 私有模块函数 trapz_x_dp(y, x) result(integral)

    参数

    类型 意图可选 属性 名称
    real(kind=dp), intent(in), dimension(:) :: y
    real(kind=dp), intent(in), dimension(:) :: x

    返回值 real(kind=dp)

  • 私有模块函数 trapz_x_sp(y, x) result(integral)

    参数

    类型 意图可选 属性 名称
    real(kind=sp), intent(in), dimension(:) :: y
    real(kind=sp), intent(in), dimension(:) :: x

    返回值 real(kind=sp)

公有接口 trapz_weights

使用给定横坐标的梯形法则权重对采样值进行积分 (规范)

  • 私有纯模块函数 trapz_weights_dp(x) result(w)

    参数

    类型 意图可选 属性 名称
    real(kind=dp), intent(in), dimension(:) :: x

    返回值 real(kind=dp), dimension(size(x))

  • 私有纯模块函数 trapz_weights_sp(x) result(w)

    参数

    类型 意图可选 属性 名称
    real(kind=sp), intent(in), dimension(:) :: x

    返回值 real(kind=sp), dimension(size(x))