prepSCE {muscat} | R Documentation |
...
prepSCE(x, cluster_id, sample_id, group_id, drop = FALSE)
x |
|
cluster_id, sample_id, group_id |
character strings specifying
the |
drop |
logical. Specifies whether |
Helena L Crowell
# generate random counts ng <- 50 nc <- 200 counts <- matrix(sample(ng * nc), nrow = ng, ncol = nc) # generate some cell metadata gids <- sample(c("groupA", "groupB"), nc, TRUE) sids <- sample(paste0("sample", seq_len(3)), nc, TRUE) kids <- sample(paste0("cluster", seq_len(5)), nc, TRUE) batch <- sample(seq_len(3), nc, TRUE) # construct SCE library(SingleCellExperiment) sce <- SingleCellExperiment( assays = list(counts = counts), colData = data.frame(group = gids, id = sids, cluster = kids, batch)) # prep. for workflow sce <- prepSCE(sce, group_id = "group", sample_id = "id", cluster_id = "cluster") head(colData(sce)) metadata(sce)$experiment_info