crossomics {omicRexposome} | R Documentation |
This function allows to perform a Transcriptome-Wide Association Study
by using an ExposmeSet
and an ExpressionSet
. It
allows to perform an adjustment using Surrogate Variable Analysis (from
R package sva
).
crossomics(object, method = "mcca", ncomponents = 2, ..., na.rm = FALSE, permute = c(100, 3), verbose = FALSE, warnings = TRUE) ## S4 method for signature 'MultiDataSet' crossomics(object, method = "mcca", ncomponents = 2, ..., na.rm = FALSE, permute = c(100, 3), verbose = FALSE, warnings = TRUE)
object |
A |
method |
(default |
ncomponents |
(default |
... |
Other arguments given to |
na.rm |
(default |
permute |
(default |
verbose |
(default |
warnings |
(default |
An object of class ResultSet
.
library(MultiDataSet) library(rexposome) data(brge_prot, package = "brgedata") data(brge_expo, package = "brgedata") mds <- createMultiDataSet() mds <- add_eset(mds, brge_prot, dataset.type = "proteines") mds <- add_eset(mds, imputation(brge_expo), dataset.type = "exposures", GRanges = NA) crs <- crossomics(mds, method = "mcia") crs