makeSimSwishData {fishpond} | R Documentation |
Makes a small swish dataset for examples and testing.
The first six genes have some differential expression
evidence in the counts, with varying degree of inferential
variance across inferential replicates (1-2: minor,
3-4: some, 5-6: substantial). The 7th and 8th
genes have all zeros to demonstrate labelKeep
.
makeSimSwishData( m = 1000, n = 10, numReps = 20, null = FALSE, meanVariance = FALSE )
m |
number of genes |
n |
number of samples |
numReps |
how many inferential replicates to generate |
null |
logical, whether to make an all null dataset |
meanVariance |
logical, whether to output only mean and variance of inferential replicates |
a SummarizedExperiment
library(SummarizedExperiment) y <- makeSimSwishData() assayNames(y)