| aldex.glm {ALDEx2} | R Documentation |
model.matrixaldex.glm calculates the expected values for each coefficient of a
glm model on the data returned by aldex.clr. This function
requires the user to define a model with model.matrix.
aldex.glm(clr, verbose = FALSE, ...)
clr |
An |
verbose |
A boolean. Toggles whether to print diagnostic information while
running. Useful for debugging errors on large datasets. Applies to
|
... |
Arguments passed to |
Returns a data.frame of the average
coefficients and their p-values for each feature,
with FDR appended as a BH column.
Thom Quinn
Please use the citation given by
citation(package="ALDEx2").
aldex,
aldex.clr,
aldex.ttest,
aldex.kw,
aldex.glm,
aldex.effect,
aldex.corr,
selex
data(selex)
#subset for efficiency
selex <- selex[1201:1600,]
covariates <- data.frame("A" = sample(0:1, 14, replace = TRUE),
"B" = c(rep(0, 7), rep(1, 7)))
mm <- model.matrix(~ A + B, covariates)
x <- aldex.clr(selex, mm, mc.samples=1, denom="all")
glm.test <- aldex.glm(x)