Imp.Estimates
位于 boot
包(package)。 说明
重要性重采样下统计量的中心矩、尾部概率和分位数估计。
用法
imp.moments(boot.out = NULL, index = 1, t = boot.out$t[, index],
w = NULL, def = TRUE, q = NULL)
imp.prob(boot.out = NULL, index = 1, t0 = boot.out$t0[index],
t = boot.out$t[, index], w = NULL, def = TRUE, q = NULL)
imp.quantile(boot.out = NULL, alpha = NULL, index = 1,
t = boot.out$t[, index], w = NULL, def = TRUE, q = NULL)
参数
boot.out |
通过调用 |
alpha |
所需分位数的 alpha 水平。默认计算 1%、2.5%、5%、10%、90%、95%、97.5% 和 99% 分位数。 |
index |
|
t0 |
需要尾部概率估计的值。对于每个值 |
t |
引导程序复制统计数据。默认情况下,这些是从引导输出对象 |
w |
引导程序重复重采样权重的重要性。如果未提供它们,则必须提供 |
def |
一个逻辑值,指示防御混合物是否用于重量计算。仅当 |
q |
一个概率向量,指定应从中找到任何估计值的重采样分布。一般来说,这对应于通常的引导重采样分布,它为每个原始观测值赋予相同的权重。估计仅通过重要性权重 |
值
包含以下组件的列表:
alpha |
如果使用 |
t0 |
如果使用 |
raw |
原始重要性重采样估计。对于 |
rat |
比率重要性重采样估计。在此方法中,权重 |
reg |
回归重要性重采样估计。在此方法中,使用的权重源自 |
例子
# Example 9.8 of Davison and Hinkley (1997) requires tilting the
# resampling distribution of the studentized statistic to be centred
# at the observed value of the test statistic, 1.84. In this example
# we show how certain estimates can be found using resamples taken from
# the tilted distribution.
grav1 <- gravity[as.numeric(gravity[,2]) >= 7, ]
grav.fun <- function(dat, w, orig) {
strata <- tapply(dat[, 2], as.numeric(dat[, 2]))
d <- dat[, 1]
ns <- tabulate(strata)
w <- w/tapply(w, strata, sum)[strata]
mns <- as.vector(tapply(d * w, strata, sum)) # drop names
mn2 <- tapply(d * d * w, strata, sum)
s2hat <- sum((mn2 - mns^2)/ns)
c(mns[2] - mns[1], s2hat, (mns[2] - mns[1] - orig)/sqrt(s2hat))
}
grav.z0 <- grav.fun(grav1, rep(1, 26), 0)
grav.L <- empinf(data = grav1, statistic = grav.fun, stype = "w",
strata = grav1[,2], index = 3, orig = grav.z0[1])
grav.tilt <- exp.tilt(grav.L, grav.z0[3], strata = grav1[, 2])
grav.tilt.boot <- boot(grav1, grav.fun, R = 199, stype = "w",
strata = grav1[, 2], weights = grav.tilt$p,
orig = grav.z0[1])
# Since the weights are needed for all calculations, we shall calculate
# them once only.
grav.w <- imp.weights(grav.tilt.boot)
grav.mom <- imp.moments(grav.tilt.boot, w = grav.w, index = 3)
grav.p <- imp.prob(grav.tilt.boot, w = grav.w, index = 3, t0 = grav.z0[3])
unlist(grav.p)
grav.q <- imp.quantile(grav.tilt.boot, w = grav.w, index = 3,
alpha = c(0.9, 0.95, 0.975, 0.99))
as.data.frame(grav.q)
参考
Davison, A. C. and Hinkley, D. V. (1997) Bootstrap Methods and Their Application. Cambridge University Press.
Hesterberg, T. (1995) Weighted average importance sampling and defensive mixture distributions. Technometrics, 37, 185-194.
Johns, M.V. (1988) Importance sampling for bootstrap confidence intervals. Journal of the American Statistical Association, 83, 709-714.
也可以看看
boot
, exp.tilt
, imp.weights
, smooth.f
, tilt.boot
相关用法
- R poisons 动物生存时间
- R ducks 杂交鸭的行为和羽毛特征
- R nodal 前列腺癌的淋巴结受累
- R cloth 布料瑕疵数量
- R polar 新喀里多尼亚红土的极点位置
- R capability 模拟制造过程数据
- R beaver 海狸体温数据
- R saddle.distn Bootstrap 统计的鞍点分布近似
- R tsboot 时间序列的引导
- R logit 比例的逻辑
- R EEF.profile 经验可能性
- R tau Tau 粒子衰变模式
- R gravity 重力加速度
- R boot 引导重采样
- R plot.boot Bootstrap 模拟的输出图
- R boot.ci 非参数引导置信区间
- R tilt.boot 非参数倾斜引导
- R envelope 曲线的置信区间
- R bigcity 美国城市人口
- R co.transfer 一氧化碳转移
- R imp.weights 重要性采样权重
- R acme 每月超额返回
- R glm.diag.plots 广义线性模型的诊断图
- R survival 辐射剂量后大鼠的存活率
- R norm.ci 正态近似置信区间
注:本文由纯净天空筛选整理自R-devel大神的英文原创作品 Importance Sampling Estimates。非经特殊声明,原始代码版权归原作者所有,本译文未经允许或授权,请勿转载或复制。