sType {edge} | R Documentation |
Access the statistic type in a deFit
object. Can
either be the optimal discovery procedure (odp) or the likelihood ratio
test (lrt).
sType(object) ## S4 method for signature 'deFit' sType(object)
object |
|
sType
returns the statistic type- either "odp" or "lrt".
John Storey, Andrew Bass
fit_models
, deFit
and
deSet
# import data library(splines) data(kidney) age <- kidney$age sex <- kidney$sex kidexpr <- kidney$kidexpr cov <- data.frame(sex = sex, age = age) # create models null_model <- ~sex full_model <- ~sex + ns(age, df = 4) # create deSet object from data de_obj <- build_models(data = kidexpr, cov = cov, null.model = null_model, full.model = full_model) # run fit_models to get model fits de_fit <- fit_models(de_obj) # extract the statistic type of model fits stat_type <- sType(de_fit)