xtabs
位於 stats
包(package)。 說明
使用公式接口從通常包含在 DataFrame 中的交叉分類因子創建列聯表(可選稀疏矩陣)。
用法
xtabs(formula = ~., data = parent.frame(), subset, sparse = FALSE,
na.action, addNA = FALSE, exclude = if(!addNA) c(NA, NaN),
drop.unused.levels = FALSE)
## S3 method for class 'xtabs'
print(x, na.print = "", ...)
參數
formula |
右側帶有交叉分類變量(由 |
data |
包含公式 |
subset |
一個可選向量,指定要使用的觀測子集。 |
sparse |
邏輯指定結果是否應該是稀疏矩陣,即從 |
na.action |
|
addNA |
邏輯指示 |
exclude |
形成分類因子級別集時要排除的值向量。 |
drop.unused.levels |
指示是否刪除分類因子中未使用的級別的邏輯。如果這是 |
x |
類 |
na.print |
指示如何打印 |
... |
傳入或傳出其他方法的進一步參數。 |
細節
對於由 table
或 xtabs(*, sparse = FALSE)
創建的列聯表對象,有一個 summary
方法,它提供基本信息並執行因子獨立性的卡方檢驗(請注意,函數 chisq.test
目前僅處理 2-d表)。
如果在 formula
中給出左側,則其條目將簡單地對對應於右側的單元格求和;如果 lhs 沒有給出計數,這也適用。
對於formula
中作為因子的變量,必須顯式指定exclude
;將不會使用默認的排除項。
在R3.4.0 之前的版本,例如,當na.action = na.pass
,有時為零(0
)被返回而不是NA
s.
請注意,當 addNA
默認為 false,並且未指定 na.action
(或設置為 NULL
)時,實際上使用 na.action =
getOption("na.action", default=na.omit)
;另請參見示例。
值
默認情況下,當 sparse = FALSE
時,是 S3 類 c("xtabs",
"table")
的數組表示形式的列聯表,其中 "call"
屬性存儲匹配的調用。
當 sparse = TRUE
時,稀疏數值矩陣,特別是包 Matrix
中的 S4 類 dgTMatrix
的對象。
例子
## 'esoph' has the frequencies of cases and controls for all levels of
## the variables 'agegp', 'alcgp', and 'tobgp'.
xtabs(cbind(ncases, ncontrols) ~ ., data = esoph)
## Output is not really helpful ... flat tables are better:
ftable(xtabs(cbind(ncases, ncontrols) ~ ., data = esoph))
## In particular if we have fewer factors ...
ftable(xtabs(cbind(ncases, ncontrols) ~ agegp, data = esoph))
## This is already a contingency table in array form.
DF <- as.data.frame(UCBAdmissions)
## Now 'DF' is a data frame with a grid of the factors and the counts
## in variable 'Freq'.
DF
## Nice for taking margins ...
xtabs(Freq ~ Gender + Admit, DF)
## And for testing independence ...
summary(xtabs(Freq ~ ., DF))
## with NA's
DN <- DF; DN[cbind(6:9, c(1:2,4,1))] <- NA
DN # 'Freq' is missing only for (Rejected, Female, B)
tools::assertError(# 'na.fail' should fail :
xtabs(Freq ~ Gender + Admit, DN, na.action=na.fail), verbose=TRUE)
op <- options(na.action = "na.omit") # the "factory" default
(xtabs(Freq ~ Gender + Admit, DN) -> xtD)
noC <- function(O) `attr<-`(O, "call", NULL)
ident_noC <- function(x,y) identical(noC(x), noC(y))
stopifnot(exprs = {
ident_noC(xtD, xtabs(Freq ~ Gender + Admit, DN, na.action = na.omit))
ident_noC(xtD, xtabs(Freq ~ Gender + Admit, DN, na.action = NULL))
})
xtabs(Freq ~ Gender + Admit, DN, na.action = na.pass)
## The Female:Rejected combination has NA 'Freq' (and NA prints 'invisibly' as "")
(xtNA <- xtabs(Freq ~ Gender + Admit, DN, addNA = TRUE)) # ==> count NAs
## show NA's better via na.print = ".." :
print(xtNA, na.print= "NA")
## Create a nice display for the warp break data.
warpbreaks$replicate <- rep_len(1:9, 54)
ftable(xtabs(breaks ~ wool + tension + replicate, data = warpbreaks))
### ---- Sparse Examples ----
if(require("Matrix")) withAutoprint({
## similar to "nlme"s 'ergoStool' :
d.ergo <- data.frame(Type = paste0("T", rep(1:4, 9*4)),
Subj = gl(9, 4, 36*4))
xtabs(~ Type + Subj, data = d.ergo) # 4 replicates each
set.seed(15) # a subset of cases:
xtabs(~ Type + Subj, data = d.ergo[sample(36, 10), ], sparse = TRUE)
## Hypothetical two-level setup:
inner <- factor(sample(letters[1:25], 100, replace = TRUE))
inout <- factor(sample(LETTERS[1:5], 25, replace = TRUE))
fr <- data.frame(inner = inner, outer = inout[as.integer(inner)])
xtabs(~ inner + outer, fr, sparse = TRUE)
})
也可以看看
table
表示傳統的cross-tabulation,as.data.frame.table
是xtabs
的逆運算(請參見下麵的DF
示例)。
sparseMatrix
包中的稀疏矩陣 Matrix
。
相關用法
- R stlmethods STL 對象的方法
- R medpolish 矩陣的中值波蘭(穩健雙向分解)
- R naprint 調整缺失值
- R summary.nls 總結非線性最小二乘模型擬合
- R summary.manova 多元方差分析的匯總方法
- R formula 模型公式
- R nls.control 控製 nls 中的迭代
- R aggregate 計算數據子集的匯總統計
- R deriv 簡單表達式的符號和算法導數
- R kruskal.test Kruskal-Wallis 秩和檢驗
- R quade.test 四方測試
- R decompose 移動平均線的經典季節性分解
- R plot.stepfun 繪製階躍函數
- R alias 查找模型中的別名(依賴項)
- R qqnorm 分位數-分位數圖
- R eff.aovlist 多層方差分析的計算效率
- R pairwise.t.test 成對 t 檢驗
- R loglin 擬合對數線性模型
- R predict.smooth.spline 通過平滑樣條擬合進行預測
- R bartlett.test 方差齊性的 Bartlett 檢驗
- R influence.measures 回歸刪除診斷
- R loess.control 設置黃土參數
- R Normal 正態分布
- R summary.lm 總結線性模型擬合
- R Uniform 均勻分布
注:本文由純淨天空篩選整理自R-devel大神的英文原創作品 Cross Tabulation。非經特殊聲明,原始代碼版權歸原作者所有,本譯文未經允許或授權,請勿轉載或複製。