plotExpression {traviz} | R Documentation |
Plot gene expression along pseudotime.
Plots a fast loess smoother of gene expression for each lineage.
plotExpression(counts, sds, gene, ...) ## S4 method for signature 'matrix,SlingshotDataSet,character' plotExpression( counts, sds, gene, type = "loess", span = 0.75, alpha = 1, lwd = 1, size = 2/3 ) ## S4 method for signature 'matrix,PseudotimeOrdering,character' plotExpression( counts, sds, gene, type = "loess", span = 0.75, alpha = 1, lwd = 1, size = 2/3 )
counts |
The matrix of gene expression counts. |
sds |
A |
gene |
Gene name of gene to plot. |
... |
parameters including: |
type |
The type of smoother. Defaults to |
span |
If |
alpha |
Numeric between 0 and 1, determines the transparency of data points,
see |
lwd |
Line width of the smoother. Passed to |
size |
Character expansion of the data points. Passed to |
A ggplot
object.
library(ggplot2) data(crv, package="traviz") data(counts, package="traviz") plotExpression(counts = counts, sds=crv, gene=rownames(counts)[1])