makeTimeSeriesExperimentFromSummarizedExperiment {TimeSeriesExperiment} | R Documentation |
TimeSeriesExperiment
constructor initializes the
object from
SummarizedExperiment::SummarizedExperiment and populates the time,
replicate, and group slots.
makeTimeSeriesExperimentFromSummarizedExperiment( se, timepoint = NULL, group = NULL, replicate = NULL )
se |
|
timepoint |
a vector indicating timepoint at which each sample
was collected or a character string equal to one of the column names
of a supplied |
group |
a vector indicating a group membership for each sample
or a character string equal to one of the column names of a supplied
|
replicate |
a vector indicating a replicate id of each sample
or a character string equal to one of the column names of a supplied
|
TimeSeriesExperiment
is an extension of
SummarizedExperiment
class.
Returns an initialized TimeSeriesExperiment
object.
raw <- matrix(runif(3000), ncol = 30) pheno.data <- data.frame( time = rep(rep(1:5, each = 3), 2), replicate = rep(1:3, 10), group = rep(1:2, each = 15)) feature.data <- data.frame( feature = paste0("F", 1:100) ) test_sumexp <- SummarizedExperiment::SummarizedExperiment( assays = list(counts = raw), rowData = feature.data, colData = pheno.data) test_TimeSeriesExperiment <- makeTimeSeriesExperimentFromSummarizedExperiment( test_sumexp, timepoint = "time", group = "group", replicate = "replicate") test_TimeSeriesExperiment