我们可以使用Base R来找到曲线下95%的面积吗?

时间:2017-08-15 23:16:14

标签: r function optimization distribution integrate

使用Base R,我想知道我是否可以确定下面标有posterior的曲线下的95%面积?

更具体地说,我想从mode(绿色虚线)向尾部移动,然后当我覆盖95%的曲线区域时停止。所需的x轴值是这个95%区域的极限,如下图所示?

     prior = function(x) dbeta(x, 15.566, 7.051) 
likelihood = function(x) dbinom(55, 100, x)
 posterior = function(x) prior(x)*likelihood(x)

mode = optimize(posterior, interval = c(0, 1), maximum = TRUE, tol = 1e-12)[[1]]

curve(posterior, n = 1e4)

P.S 换句话说,非常希望这样的间隔可能是最短的95%间隔。

enter image description here

2 个答案:

答案 0 :(得分:11)

对称分布

尽管OP的例子并不是完全对称的,但它已经足够接近了 - 因为解决方案要简单得多,所以很有用。

您可以使用integrateoptimize的组合。我把它写成自定义函数,但请注意,如果你在其他情况下使用它,你可能需要重新考虑搜索分位数的界限。

# For a distribution with a single peak, find the symmetric!
# interval that contains probs probability. Search over 'range'.
f_quan <- function(fun, probs, range=c(0,1)){

  mode <- optimize(fun, interval = range, maximum = TRUE, tol = 1e-12)[[1]]

  total_area <- integrate(fun, range[1], range[2])[[1]]

  O <- function(d){
    parea <- integrate(fun, mode-d, mode+d)[[1]] / total_area
    (probs - parea)^2
  }
  # Bounds for searching may need some adjustment depending on the problem!
  o <- optimize(O, c(0,range[2]/2 - 1E-02))[[1]]

return(c(mode-o, mode+o))
}

像这样使用,

f <- f_quan(posterior, 0.95)
curve(posterior, n = 1e4)
abline(v=f, col="blue", lwd=2, lty=3)

给出

enter image description here

不对称分布

在不对称分布的情况下,我们必须搜索满足P(a

解决方案中重要的是domain的定义,我们要搜索的区域(我们不能使用-Inf, Inf,因此用户必须将其设置为合理的值)。

# consider interval (a,b) on the x-axis
# integrate our function, normalize to total area, to 
# get the total probability in the interval
prob_ab <- function(fun, a, b, domain){
  totarea <- integrate(fun, domain[1], domain[2])[[1]]
  integrate(fun, a, b)[[1]] / totarea
}

# now given a and the probability, invert to find b
invert_prob_ab <- function(fun, a, prob, domain){

  O <- function(b, fun, a, prob){
    (prob_ab(fun, a, b, domain=domain) - prob)^2
  }

  b <- optimize(O, c(a, domain[2]), a = a, fun=fun, prob=prob)$minimum

return(b)
}

# now find the shortest interval by varying a
# Simplification: don't search past the mode, otherwise getting close
# to the right-hand side of domain will give serious trouble!
prob_int_shortest <- function(fun, prob, domain){

  mode <- optimize(fun, interval = domain, maximum = TRUE, tol = 1e-12)[[1]]

  # objective function to be minimized: the width of the interval
  O <- function(a, fun, prob, domain){
    b <- invert_prob_ab(fun, a, prob, domain)

    b - a
  }

  # shortest interval that meets criterium
  abest <- optimize(O, c(0,mode), fun=fun, prob=prob, domain=domain)$minimum

  # now return the interval
  b <- invert_prob_ab(fun, abest, prob, domain)

return(c(abest,b))
}

现在使用上面这样的代码。我使用非常不对称的函数(假设mydist实际上是一些复杂的pdf,而不是dgamma)。

mydist <- function(x)dgamma(x, shape=2)
curve(mydist(x), from=0,  to=10)
abline(v=prob_int_shortest(mydist, 0.9, c(0,10)), lty=3, col="blue", lwd=2)

在这个例子中,我将域设置为(0,10),因为显然间隔必须在某处。请注意,使用像(0,1E05)这样的非常大的值不起作用,因为integrate在长序列近零时遇到问题。同样,对于您的情况,您将不得不调整域名(除非有人有更好的想法!)。

enter image description here

答案 1 :(得分:1)

以下是使用Trapezoidal rule的解决方案。你会注意到@Remko提供的解决方案是非常优越的,但是这个解决方案希望增加一些教学价值,因为它阐明了复杂的问题可以简化为简单的几何,算术和基本编程结构,如for loops。 / p>

findXVals <- function(lim, p) {
    ## (1/p) is the precision

    ## area of a trapezoid
    trapez <- function(h1, h2, w) {(h1 + h2) * w / 2}

    yVals <- posterior((1:(p - 1))/p)
    m <- which.max(yVals)
    nZ <- which(yVals > 1/p)

    b <- m + 1
    e <- m - 1
    a <- f <- m

    area <- 0
    myRng <- 1:(length(nZ)-1)
    totArea <- sum(trapez(yVals[nZ[myRng]], yVals[nZ[myRng+1]], 1/p))
    targetArea <- totArea * lim

    while (area < targetArea) {
        area <- area + trapez(yVals[a], yVals[b], 1/p) + trapez(yVals[e], yVals[f], 1/p)
        a <- b
        b <- b + 1
        f <- e
        e <- e - 1
    }

    c((a - 1)/p, (f + 1)/p)
}

findXVals(.95, 10^5)
[1] 0.66375 0.48975