| zinbAIC {zinbwave} | R Documentation |
Given a statistical model and some data, these functions compute the AIC or BIC of the model given the data, i.e., the AIC/BIC of the data under the model.
zinbAIC(model, x) zinbBIC(model, x) ## S4 method for signature 'ZinbModel,matrix' zinbAIC(model, x) ## S4 method for signature 'ZinbModel,matrix' zinbBIC(model, x)
model |
an object that describes a statistical model. |
x |
an object that describes data. |
the AIC/BIC of the model.
zinbAIC,ZinbModel,matrix-method: returns the AIC of the ZINB model.
zinbBIC,ZinbModel,matrix-method: returns the BIC of the ZINB model.
se <- SummarizedExperiment(matrix(rpois(60, lambda=5), nrow=10, ncol=6),
colData = data.frame(bio = gl(2, 3)))
m <- zinbFit(se, X=model.matrix(~bio, data=colData(se)),
BPPARAM=BiocParallel::SerialParam())
zinbAIC(m, t(assay(se)))
zinbBIC(m, t(assay(se)))