得到ECDF的衍生物

问题描述 投票:2回答:1

有可能区分ECDF吗?以下面获得的例子为例。

set.seed(1)

a <- sort(rnorm(100))
b <- ecdf(a)

plot(b)

enter image description here

我想采用b的导数来获得其概率密度函数(PDF)。

r statistics ecdf
1个回答
3
投票
n <- length(a)  ## `a` must be sorted in non-decreasing order already
plot(a, 1:n / n, type = "s")  ## "staircase" plot; not "line" plot

但是,我希望找到b的衍生物

在基于样本的统计中,估计密度(对于连续随机变量)不是通过区分从ECDF获得的,因为样本大小是有限的并且ECDF不可微分。相反,我们直接估算密度。我想plot(density(a))是你真正想要的。


几天后..

Warning: the following is just a numerical solution without statistical ground!

我把它作为练习来学习R package scam用于形状约束的添加剂模型,这是由Wood教授的早期博士生Pya博士提供的mgcv儿童包。

逻辑是这样的:

  • 使用scam::scam,将单调递增的P样条拟合到ECDF(你必须指定你想要多少个结); [注意单调性不是唯一的理论约束。要求平滑的ECDF在其两条边上“剪切”:左边缘为0,右边缘为1.我正在使用weights施加这样的约束,通过在两个边缘给予非常大的重量]
  • 使用stats::splinefun,使用单调插值样条通过节点和结点的预测值重新参数化拟合样条。
  • 返回插值样条函数,它还可以评估第一,第二和第三导数。

为什么我希望这个工作:

随着样本量的增长,

  • ECDF汇聚于CDF;
  • P样条是一致的,因此平滑的ECDF对于ECDF将越来越不偏不倚;
  • 平滑的ECDF的一阶导数将越来越不偏不倚用于PDF。

谨慎使用:

  • 你必须自己选择结数;
  • 导数未标准化,曲线下面积为1;
  • 结果可能相当不稳定,仅适用于大样本量。

函数参数:

  • x:样本矢量;
  • n.knots:结数;
  • n.cells:绘制导数函数时的网格点数

您需要从CRAN安装scam软件包。

library(scam)

test <- function (x, n.knots, n.cells) {

  ## get ECDF
  n <- length(x)
  x <- sort(x)
  y <- 1:n / n
  dat <- data.frame(x = x, y = y)  ## make sure `scam` can find `x` and `y`

  ## fit a monotonically increasing P-spline for ECDF
  fit <- scam::scam(y ~ s(x, bs = "mpi", k = n.knots), data = dat,
                    weights = c(n, rep(1, n - 2), 10 * n))
  ## interior knots
  xk <- with(fit$smooth[[1]], knots[4:(length(knots) - 3)])
  ## spline values at interior knots
  yk <- predict(fit, newdata = data.frame(x = xk))
  ## reparametrization into a monotone interpolation spline
  f <- stats::splinefun(xk, yk, "hyman")

  par(mfrow = c(1, 2))

  plot(x, y, pch = 19, col = "gray")  ## ECDF
  lines(x, f(x), type = "l")          ## smoothed ECDF
  title(paste0("number of knots: ", n.knots,
               "\neffective degree of freedom: ", round(sum(fit$edf), 2)),
        cex.main = 0.8)

  xg <- seq(min(x), max(x), length = n.cells)
  plot(xg, f(xg, 1), type = "l")     ## density estimated by scam
  lines(stats::density(x), col = 2)  ## a proper density estimate by density

  ## return smooth ECDF function
  f
  }

## try large sample size
set.seed(1)
x <- rnorm(1000)
f <- test(x, n.knots = 20, n.cells = 100)

test

f是由stats::splinefun(读?splinefun)返回的函数。

一个天真的,类似的解决方案是在没有平滑的情况下对ECDF进行插值样条。但这是一个非常糟糕的主意,因为我们没有一致性。

g <- splinefun(sort(x), 1:length(x) / length(x), method = "hyman")
curve(g(x, deriv = 1), from = -3, to = 3)

enter image description here

提醒:强烈建议使用stats::density进行直接密度估算。

© www.soinside.com 2019 - 2024. All rights reserved.