首页
学习
活动
专区
圈层
工具
发布
首页
学习
活动
专区
圈层
工具
社区首页 >问答首页 >R中具有Welch校正的单因素方差的后验检验

R中具有Welch校正的单因素方差的后验检验
EN

Stack Overflow用户
提问于 2015-02-18 15:38:53
回答 2查看 10.5K关注 0票数 3

我使用R中的oneway.test()对韦尔奇的修正进行了单向方差分析检验,因为我有违反等方差假设的数据(转换没有解决问题)。

一个简单的数据示例:

代码语言:javascript
运行
AI代码解释
复制
> dput(df)
structure(list(Count = c(13, 14, 14, 12, 11, 13, 14, 15, 13, 
12, 20, 15, 9, 5, 13, 14, 7, 17, 18, 14, 12, 12, 13, 14, 11, 
10, 15, 14, 14, 13), Group = structure(c(1L, 1L, 1L, 1L, 1L, 
1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 
3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c("a", "b", "c"
), class = "factor")), .Names = c("Count", "Group"), row.names = c(NA, 
-30L), class = "data.frame")

library(car) 
grp = as.factor(c(rep(1, 10), rep(2, 10),rep(3, 10)))
leveneTest(df$Count,grp) #unequal variances

#one-way ANOVA with welch's correction
oneway.test(Count ~ Group, data=df, na.action=na.omit, var.equal=FALSE)

我有多个组,所以我现在想运行成对的post-hoc测试。有没有什么方法可以用oneway.test()函数中的对象来做到这一点?如果不是,如何在方差不相等的组上运行成对测试?我还没能在网上找到这个问题的答案。任何建议都将不胜感激。

EN

回答 2

Stack Overflow用户

回答已采纳

发布于 2015-02-18 20:05:45

这里有两种方法:

数据

代码语言:javascript
运行
AI代码解释
复制
library(car) 
df <- structure(list(Count = c(13, 14, 14, 12, 11, 13, 14, 15, 13, 12, 20, 15, 9, 5, 13, 14, 7, 17, 18, 14, 12, 12, 13, 14, 11, 10, 15, 14, 14, 13),
                     Group = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L, 3L), .Label = c("a", "b", "c" ), class = "factor")),
                .Names = c("Count", "Group"),
                row.names = c(NA, -30L), class = "data.frame")

基数R

首先,Group因子的唯一对的集合:

代码语言:javascript
运行
AI代码解释
复制
allPairs <- expand.grid(levels(df$Group), levels(df$Group))
## http://stackoverflow.com/questions/28574006/unique-combination-of-two-columns-in-r/28574136#28574136
allPairs <- unique(t(apply(allPairs, 1, sort)))
allPairs <- allPairs[ allPairs[,1] != allPairs[,2], ]
allPairs
##      [,1] [,2]
## [1,] "a"  "b" 
## [2,] "a"  "c" 
## [3,] "b"  "c" 

现在来分析一下:

代码语言:javascript
运行
AI代码解释
复制
allResults <- apply(allPairs, 1, function(p) {
    dat <- df[ df$Group %in% p, ]
    ret <- oneway.test(Count ~ Group, data = dat, na.action = na.omit, var.equal = FALSE)
    ret$groups <- p
    ret
})
length(allResults)
## [1] 3
allResults[[1]]
##  One-way analysis of means (not assuming equal variances)
## data:  Count and Group
## F = 0.004, num df = 1.000, denom df = 10.093, p-value = 0.9508

如果你想要这是一个矩阵,也许是这样:

代码语言:javascript
运行
AI代码解释
复制
mm <- diag(length(levels(df$Group)))
dimnames(mm) <- list(levels(df$Group), levels(df$Group))
pMatrix <- lapply(allResults, function(res) {
    ## not fond of out-of-scope assignment ...
    mm[res$groups[1], res$groups[2]] <<- mm[res$groups[2], res$groups[1]] <<- res$p.value
})
mm
##           a         b         c
## a 1.0000000 0.9507513 0.6342116
## b 0.9507513 1.0000000 0.8084057
## c 0.6342116 0.8084057 1.0000000

(对于F统计量,这也可以很容易地完成。)

使用dplyr

首先,Group因子的唯一对的集合:

代码语言:javascript
运行
AI代码解释
复制
library(dplyr)
## http://stackoverflow.com/questions/28574006/unique-combination-of-two-columns-in-r/28574136#28574136
allPairs <- expand.grid(levels(df$Group), levels(df$Group), stringsAsFactors = FALSE)  %>%
    filter(Var1 != Var2) %>%
    mutate(key = paste0(pmin(Var1, Var2), pmax(Var1, Var2), sep='')) %>%
    distinct(key) %>%
    select(-key)
allPairs
##   Var1 Var2
## 1    b    a
## 2    c    a
## 3    c    b

如果顺序真的很重要,您可以在此管道中提前添加dplyr::arrange(Var1, Var2),也许可以在调用expand.grid之后添加。

现在来分析一下:

代码语言:javascript
运行
AI代码解释
复制
ret <- allPairs %>%
    rowwise() %>%
    do({
        data.frame(.,
                   oneway.test(Count ~ Group, filter(df, Group %in% c(.$Var1, .$Var2)),
                               na.action = na.omit, var.equal = FALSE)[c('statistic', 'p.value')],
                   stringsAsFactors = FALSE)
    })

ret
## Source: local data frame [3 x 4]
## Groups: <by row>
##   Var1 Var2   statistic   p.value
## 1    b    a 0.004008909 0.9507513
## 2    c    a 0.234782609 0.6342116
## 3    c    b 0.061749571 0.8084057

(我并没有对这两种方法的性能提出任何要求;通常,其中一种方法只需要很少的数据,而另一种方法则需要更大的数据集。它们似乎都使用相同的结果执行相同的统计成对比较。看你的了!)

票数 3
EN

Stack Overflow用户

发布于 2015-06-26 13:26:32

只是补充一下,尽管时机不佳,给出了比我自己一直在寻找的类似东西,也有执行游戏-豪厄尔测试的选项。这甚至被包含在这个stackexchange_post中介绍的“userfriendlyscience”R包中的“posthoc.tgh”函数下。它代表了对不等方差的Tukey-Kramer检验的扩展。posthocTGH {用户友好科学}

原始出版物(甚至在我出生之前):保罗·A·游戏和约翰·豪厄尔。具有不等N's和/或方差的成对多重比较程序:蒙特卡洛研究。《教育与行为统计杂志》,第一卷,第二期,1976,第113-125页。doi: 10.3102/10769986001002113

票数 5
EN
页面原文内容由Stack Overflow提供。腾讯云小微IT领域专用引擎提供翻译支持
原文链接:

https://stackoverflow.com/questions/28587498

复制
相关文章

相似问题

领券
问题归档专栏文章快讯文章归档关键词归档开发者手册归档开发者手册 Section 归档
查看详情【社区公告】 技术创作特训营有奖征文