plot3d-SlingshotDataSet {slingshot} | R Documentation |
Tools for visualizing lineages inferred by slingshot
.
## S3 method for class 'SlingshotDataSet' plot3d(x, type = NULL, add = FALSE, dims = seq_len(3), aspect = "iso", ...)
x |
a |
type |
character, the type of output to be plotted, can be one of
|
add |
logical, indicates whether the output should be added to an existing plot. |
dims |
numeric, which dimensions to plot (default is |
aspect |
either a logical indicating whether to adjust the aspect ratio
or a new ratio, see |
... |
additional parameters to be passed to |
If type == 'lineages'
, straight line connectors between
cluster centers will be plotted. If type == 'curves'
, simultaneous
princiapl curves will be plotted.
When type
is not specified, the function will first check the
curves
slot and plot the curves, if present. Otherwise,
lineages
will be plotted, if present.
returns NULL
.
## Not run: library(rgl) data("slingshotExample") rd <- cbind(rd, rnorm(nrow(rd))) sds <- slingshot(rd, cl, start.clus = "1") plot3d(sds, type = 'b') # add to existing plot plot3d(rd, col = 'grey50', aspect = 'iso') plot3d(sds, lwd = 3, add = TRUE) ## End(Not run)