tilt.boot
位于 boot
包(package)。 说明
此函数将运行具有相等重采样概率(如果需要)的初始引导程序,并将使用初始运行的输出来查找将统计值置于所需值的重采样概率。然后,它使用计算出的概率作为重采样分布来运行重要性重采样引导程序。
用法
tilt.boot(data, statistic, R, sim = "ordinary", stype = "i",
strata = rep(1, n), L = NULL, theta = NULL,
alpha = c(0.025, 0.975), tilt = TRUE, width = 0.5,
index = 1, ...)
参数
data |
数据为向量、矩阵或 DataFrame 。如果它是矩阵或 DataFrame ,则每一行都被视为一个(多变量)观察。 |
statistic |
应用于数据时返回包含感兴趣统计数据的向量的函数。它必须至少有两个参数。第一个参数始终是 |
R |
所需的引导程序重复次数。这通常是一个向量,第一个值表示在初始阶段要执行多少次统一引导模拟。 |
sim |
这是一个字符串,指示所需的引导模拟类型。只能采用两个可能的值: |
stype |
指示 |
strata |
表示多样本问题的层的整数向量或因子。 |
L |
感兴趣统计的经验影响值。当 |
theta |
倾斜分布所需的参数值。每个非均匀分布都应该有一个 |
alpha |
需要倾斜的 alpha 级别。如果 |
tilt |
一个逻辑变量,如果 |
width |
仅当 |
index |
|
... |
|
值
类 "boot"
的对象,具有以下组件
t0 |
原始数据统计量的观测值。 |
t |
引导程序的值复制了统计数据。其中会有 |
R |
自举重复次数的输入向量。 |
data |
提供的原始数据。 |
statistic |
提供的 |
sim |
引导程序中使用的模拟类型,可以是 |
stype |
提供的统计数据类型,与输入值 |
call |
对 |
strata |
所提供的地层。 |
weights |
使用的权重矩阵。如果 |
theta |
|
例子
# Note that these examples can take a while to run.
# Example 9.9 of Davison and Hinkley (1997).
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)
tilt.boot(grav1, grav.fun, R = c(249, 375, 375), stype = "w",
strata = grav1[,2], tilt = TRUE, index = 3, orig = grav.z0[1])
# Example 9.10 of Davison and Hinkley (1997) requires a balanced
# importance resampling bootstrap to be run. In this example we
# show how this might be run.
acme.fun <- function(data, i, bhat) {
d <- data[i,]
n <- nrow(d)
d.lm <- glm(d$acme~d$market)
beta.b <- coef(d.lm)[2]
d.diag <- boot::glm.diag(d.lm)
SSx <- (n-1)*var(d$market)
tmp <- (d$market-mean(d$market))*d.diag$res*d.diag$sd
sr <- sqrt(sum(tmp^2))/SSx
c(beta.b, sr, (beta.b-bhat)/sr)
}
acme.b <- acme.fun(acme, 1:nrow(acme), 0)
acme.boot1 <- tilt.boot(acme, acme.fun, R = c(499, 250, 250),
stype = "i", sim = "balanced", alpha = c(0.05, 0.95),
tilt = TRUE, index = 3, bhat = acme.b[1])
参考
Booth, J.G., Hall, P. and Wood, A.T.A. (1993) Balanced importance resampling for the bootstrap. Annals of Statistics, 21, 286-298.
Davison, A.C. and Hinkley, D.V. (1997) Bootstrap Methods and Their Application. Cambridge University Press.
Hinkley, D.V. and Shi, S. (1989) Importance sampling and the nested bootstrap. Biometrika, 76, 435-446.
也可以看看
boot
, exp.tilt
, Imp.Estimates
, imp.weights
, smooth.f
相关用法
- R tsboot 时间序列的引导
- R tau Tau 粒子衰变模式
- R tuna 金枪鱼目击数据
- R poisons 动物生存时间
- R ducks 杂交鸭的行为和羽毛特征
- R nodal 前列腺癌的淋巴结受累
- R cloth 布料瑕疵数量
- R polar 新喀里多尼亚红土的极点位置
- R capability 模拟制造过程数据
- R beaver 海狸体温数据
- R saddle.distn Bootstrap 统计的鞍点分布近似
- R logit 比例的逻辑
- R EEF.profile 经验可能性
- R gravity 重力加速度
- R boot 引导重采样
- R plot.boot Bootstrap 模拟的输出图
- R boot.ci 非参数引导置信区间
- R envelope 曲线的置信区间
- R bigcity 美国城市人口
- R co.transfer 一氧化碳转移
- R imp.weights 重要性采样权重
- R acme 每月超额返回
- R glm.diag.plots 广义线性模型的诊断图
- R survival 辐射剂量后大鼠的存活率
- R norm.ci 正态近似置信区间
注:本文由纯净天空筛选整理自R-devel大神的英文原创作品 Non-parametric Tilted Bootstrap。非经特殊声明,原始代码版权归原作者所有,本译文未经允许或授权,请勿转载或复制。