plotGeneCount {tradeSeq} | R Documentation |
Plot the gene in reduced dimensional space.
plotGeneCount(curve, ...) ## S4 method for signature 'SlingshotDataSet' plotGeneCount( curve, counts = NULL, gene = NULL, clusters = NULL, models = NULL, title = NULL ) ## S4 method for signature 'PseudotimeOrdering' plotGeneCount( curve, counts = NULL, gene = NULL, clusters = NULL, models = NULL, title = NULL ) ## S4 method for signature 'SingleCellExperiment' plotGeneCount( curve, counts = NULL, gene = NULL, clusters = NULL, models = NULL, title = NULL )
curve |
One of the following:
|
... |
parameters including: |
counts |
The count matrix, genes in rows and cells in columns. Only
needed if the input is of the type |
gene |
The name of gene for which you want to plot the count or the row
number of that gene in the count matrix. Alternatively, one can specify
the |
clusters |
The assignation of each cell to a cluster. Used to color the
plot. Either |
models |
The fitted GAMs, typically the output from
|
title |
Title for the plot. |
If both gene
and clusters
arguments are supplied, the
plot will be colored according to gene count level. If none are provided, the
function will fail.
A ggplot
object
set.seed(97) library(slingshot) data(crv, package="tradeSeq") data(countMatrix, package="tradeSeq") rd <- slingReducedDim(crv) cl <- kmeans(rd, centers = 7)$cluster lin <- getLineages(rd, clusterLabels = cl, start.clus = 4) crv <- getCurves(lin) counts <- as.matrix(countMatrix) gamList <- fitGAM(counts = counts, pseudotime = slingPseudotime(crv, na = FALSE), cellWeights = slingCurveWeights(crv)) plotGeneCount(crv, counts, gene = "Mpo")