Es gibt verschiedene Möglichkeiten, Konfidenzintervalle für den Mittelwert einer logarithmischen Normalverteilung zu berechnen. Ich werde zwei Methoden vorstellen: Bootstrap und Profile Likelihood. Ich werde auch eine Diskussion über Jeffreys vorlegen.
Bootstrap
Für die MLE
In diesem Fall wird der MLE von ( μ , σ) für eine Probe ( x1, . . . , xn) ist ,
μ^= 1n∑j = 1nLog( xj) ;σ^2=1n∑j =1n( log(xj) - μ^)2.
Dann wird der MLE des Mittelwert δ = exp ( μ + σ 2 / 2 ) . Durch Resampling wir erhalten können Bootstrap - Probe von δ und diese verwenden, können wir berechnen mehr Bootstrap - Konfidenzintervall. Die folgenden Codes zeigen, wie Sie diese erhalten.δ^=exp(μ^+σ^2/2)δ^R
rm(list=ls())
library(boot)
set.seed(1)
# Simulated data
data0 = exp(rnorm(100))
# Statistic (MLE)
mle = function(dat){
m = mean(log(dat))
s = mean((log(dat)-m)^2)
return(exp(m+s/2))
}
# Bootstrap
boots.out = boot(data=data0, statistic=function(d, ind){mle(d[ind])}, R = 10000)
plot(density(boots.out$t))
# 4 types of Bootstrap confidence intervals
boot.ci(boots.out, conf = 0.95, type = "all")
Für den Stichprobenmittelwert
Betrachtet man nun den Schätzer δ~=x¯ anstelle des MLE. Andere Arten von Schätzern könnten ebenfalls in Betracht gezogen werden.
rm(list=ls())
library(boot)
set.seed(1)
# Simulated data
data0 = exp(rnorm(100))
# Statistic (MLE)
samp.mean = function(dat) return(mean(dat))
# Bootstrap
boots.out = boot(data=data0, statistic=function(d, ind){samp.mean(d[ind])}, R = 10000)
plot(density(boots.out$t))
# 4 types of Bootstrap confidence intervals
boot.ci(boots.out, conf = 0.95, type = "all")
Profil Wahrscheinlichkeit
Zur Definition von Wahrscheinlichkeits- und Profilwahrscheinlichkeitsfunktionen siehe . Unter Verwendung der Invarianz - Eigenschaft der Wahrscheinlichkeit , können wir wie folgt reparameterise (μ,σ)→(δ,σ) , wobei δ=exp(μ+σ2/2) , und dann berechnen numerisch das Profil Wahrscheinlichkeit von δ .
Rp( δ) = supσL (δ, σ)supδ, σL (δ, σ).
( 0 , 1 ]0,147 95 %δR
set.seed(1)
# Simulated data
data0 = exp(rnorm(100))
# Log likelihood
ll = function(mu,sigma) return( sum(log(dlnorm(data0,mu,sigma))))
# Profile likelihood
Rp = function(delta){
temp = function(sigma) return( sum(log(dlnorm(data0,log(delta)-0.5*sigma^2,sigma)) ))
max=exp(optimize(temp,c(0.25,1.5),maximum=TRUE)$objective -ll(mean(log(data0)),sqrt(mean((log(data0)-mean(log(data0)))^2))))
return(max)
}
vec = seq(1.2,2.5,0.001)
rvec = lapply(vec,Rp)
plot(vec,rvec,type="l")
# Profile confidence intervals
tr = function(delta) return(Rp(delta)-0.147)
c(uniroot(tr,c(1.2,1.6))$root,uniroot(tr,c(2,2.3))$root)
⋆
In diesem Abschnitt wird ein alternativer Algorithmus zur Berechnung eines Glaubwürdigkeitsintervalls für , der auf Metropolis-Hastings-Stichproben und der Verwendung des Jeffreys-Prior basiertδ vorgestellt basiert.
( μ , σ)
π( μ , σ) ∝ σ- 2,
n ≥ 2R
library(mcmc)
set.seed(1)
# Simulated data
data0 = exp(rnorm(100))
# Log posterior
lp = function(par){
if(par[2]>0) return( sum(log(dlnorm(data0,par[1],par[2]))) - 2*log(par[2]))
else return(-Inf)
}
# Metropolis-Hastings
NMH = 260000
out = metrop(lp, scale = 0.175, initial = c(0.1,0.8), nbatch = NMH)
#Acceptance rate
out$acc
deltap = exp( out$batch[,1][seq(10000,NMH,25)] + 0.5*(out$batch[,2][seq(10000,NMH,25)])^2 )
plot(density(deltap))
# 95% credibility interval
c(quantile(deltap,0.025),quantile(deltap,0.975))
Beachten Sie, dass sie sehr ähnlich sind.