/core/src/library/stats/R/pairwise.R

http://renjin.googlecode.com/ · R · 144 lines · 123 code · 6 blank · 15 comment · 24 complexity · 6217ebf6f50f90ca2cad67c72ef01d40 MD5 · raw file

  1. # File src/library/stats/R/pairwise.R
  2. # Part of the R package, http://www.R-project.org
  3. #
  4. # This program is free software; you can redistribute it and/or modify
  5. # it under the terms of the GNU General Public License as published by
  6. # the Free Software Foundation; either version 2 of the License, or
  7. # (at your option) any later version.
  8. #
  9. # This program is distributed in the hope that it will be useful,
  10. # but WITHOUT ANY WARRANTY; without even the implied warranty of
  11. # MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
  12. # GNU General Public License for more details.
  13. #
  14. # A copy of the GNU General Public License is available at
  15. # http://www.r-project.org/Licenses/
  16. pairwise.t.test <-
  17. function(x, g, p.adjust.method = p.adjust.methods, pool.sd = !paired,
  18. paired = FALSE, alternative = c("two.sided", "less", "greater"), ...)
  19. {
  20. if (paired & pool.sd)
  21. stop("Pooling of SD is incompatible with paired tests")
  22. DNAME <- paste(deparse(substitute(x)), "and", deparse(substitute(g)))
  23. g <- factor(g)
  24. p.adjust.method <- match.arg(p.adjust.method)
  25. alternative <- match.arg(alternative)
  26. if (pool.sd)
  27. {
  28. METHOD <- "t tests with pooled SD"
  29. xbar <- tapply(x, g, mean, na.rm = TRUE)
  30. s <- tapply(x, g, sd, na.rm = TRUE)
  31. n <- tapply(!is.na(x), g, sum)
  32. degf <- n - 1
  33. total.degf <- sum(degf)
  34. pooled.sd <- sqrt(sum(s^2 * degf)/total.degf)
  35. compare.levels <- function(i, j) {
  36. dif <- xbar[i] - xbar[j]
  37. se.dif <- pooled.sd * sqrt(1/n[i] + 1/n[j])
  38. t.val <- dif/se.dif
  39. if (alternative == "two.sided")
  40. 2 * pt(-abs(t.val), total.degf)
  41. else
  42. pt(t.val, total.degf,
  43. lower.tail=(alternative == "less"))
  44. }
  45. } else {
  46. METHOD <- if (paired) "paired t tests"
  47. else "t tests with non-pooled SD"
  48. compare.levels <- function(i, j) {
  49. xi <- x[as.integer(g) == i]
  50. xj <- x[as.integer(g) == j]
  51. t.test(xi, xj, paired=paired,
  52. alternative=alternative, ...)$p.value
  53. }
  54. }
  55. PVAL <- pairwise.table(compare.levels, levels(g), p.adjust.method)
  56. ans <- list(method = METHOD, data.name = DNAME,
  57. p.value = PVAL, p.adjust.method=p.adjust.method)
  58. class(ans) <- "pairwise.htest"
  59. ans
  60. }
  61. pairwise.wilcox.test <-
  62. function(x, g, p.adjust.method = p.adjust.methods, paired=FALSE, ...)
  63. {
  64. p.adjust.method <- match.arg(p.adjust.method)
  65. DNAME <- paste(deparse(substitute(x)), "and", deparse(substitute(g)))
  66. g <- factor(g)
  67. METHOD <- if (paired) "Wilcoxon signed rank test"
  68. else "Wilcoxon rank sum test"
  69. compare.levels <- function(i, j) {
  70. xi <- x[as.integer(g) == i]
  71. xj <- x[as.integer(g) == j]
  72. wilcox.test(xi, xj, paired=paired, ...)$p.value
  73. }
  74. PVAL <- pairwise.table(compare.levels, levels(g), p.adjust.method)
  75. ans <- list(method = METHOD, data.name = DNAME,
  76. p.value = PVAL, p.adjust.method=p.adjust.method)
  77. class(ans) <- "pairwise.htest"
  78. ans
  79. }
  80. pairwise.prop.test <-
  81. function (x, n, p.adjust.method = p.adjust.methods, ...)
  82. {
  83. p.adjust.method <- match.arg(p.adjust.method)
  84. METHOD <- "Pairwise comparison of proportions"
  85. DNAME <- deparse(substitute(x))
  86. if (is.matrix(x)) {
  87. if (ncol(x) != 2)
  88. stop("'x' must have 2 columns")
  89. n <- rowSums(x)
  90. x <- x[, 1]
  91. }
  92. else {
  93. DNAME <- paste(DNAME, "out of", deparse(substitute(n)))
  94. if (length(x) != length(n))
  95. stop("'x' and 'n' must have the same length")
  96. }
  97. OK <- complete.cases(x, n)
  98. x <- x[OK]
  99. n <- n[OK]
  100. if (length(x) < 2L)
  101. stop("too few groups")
  102. compare.levels <- function(i, j) {
  103. prop.test(x[c(i,j)], n[c(i,j)], ...)$p.value
  104. }
  105. level.names <- names(x)
  106. if (is.null(level.names)) level.names <- seq_along(x)
  107. PVAL <- pairwise.table(compare.levels, level.names, p.adjust.method)
  108. ans <- list(method = METHOD, data.name = DNAME,
  109. p.value = PVAL, p.adjust.method=p.adjust.method)
  110. class(ans) <- "pairwise.htest"
  111. ans
  112. }
  113. pairwise.table <-
  114. function(compare.levels, level.names, p.adjust.method)
  115. {
  116. ix <- seq_along(level.names)
  117. names(ix) <- level.names
  118. pp <- outer(ix[-1L], ix[-length(ix)],function(ivec, jvec)
  119. sapply(seq_along(ivec), function(k) {
  120. i<-ivec[k]
  121. j<-jvec[k]
  122. if (i > j) compare.levels(i, j) else NA
  123. }))
  124. pp[lower.tri(pp, TRUE)] <- p.adjust(pp[lower.tri(pp, TRUE)],
  125. p.adjust.method)
  126. pp
  127. }
  128. print.pairwise.htest <-
  129. function(x, ...)
  130. {
  131. cat("\n\tPairwise comparisons using", x$method, "\n\n")
  132. cat("data: ", x$data.name, "\n\n")
  133. pp <- format.pval(x$p.value, 2, na.form="-")
  134. attributes(pp) <- attributes(x$p.value)
  135. print(pp, quote=FALSE)
  136. cat("\nP value adjustment method:", x$p.adjust.method, "\n")
  137. invisible(x)
  138. }