visHist {CellMixS} | R Documentation |
Plot pvalue histograms of metric score distributions
visHist(res_object, metric_prefix = "cms", n_col = 1)
res_object |
|
metric_prefix |
Character. Prefix to specify names of
|
n_col |
Numeric. Number of columns of the pval histogram. |
Plots metric score distribution similar to a pvalue histogram
distribution. Without dataset-specific bias, cms scores should be approx.
flat distributed. If 'res_object' is a matrix or data.frame,
it will create a histogram for each column. If 'res_object' is a
SingleCellExperiment
object, it will create a histogram of all
colData(res_object)
that start with 'metric_prefix'.
a ggplot
object.
Other visualize metric functions: visMetric
,
visOverview
library(SingleCellExperiment) sim_list <- readRDS(system.file("extdata/sim50.rds", package = "CellMixS")) sce <- sim_list[[1]][, c(1:50)] sce_cms <- cms(sce, "batch", k = 20, n_dim = 2) visHist(sce_cms)