geom_beeswarm_interactive {NanoStringNCTools} | R Documentation |
The interactive version of geom_beeswarm
from
ggbeeswarm.
geom_beeswarm_interactive(mapping = NULL, data = NULL, priority = c("ascending", "descending", "density", "random", "none"), cex = 1, groupOnX = NULL, dodge.width = 0, stat = "identity", na.rm = FALSE, show.legend = NA, inherit.aes = TRUE, ...)
mapping |
The aesthetic mapping.
See |
data |
The data to be displayed at this layer.
See |
priority |
Method used to perform point layout.
See |
cex |
Scaling for adjusting point spacing.
See |
groupOnX |
Indicator for jittering on x-axis.
See |
dodge.width |
Dodge amount for points from different aesthetic groups.
See |
stat |
The statistical transformation to use on the data for this layer.
See |
na.rm |
Indicator for removing missing values with a warning.
See |
show.legend |
Indicator for including this layer in the legend.
See |
inherit.aes |
Indicator for inheriting the aesthetics.
See |
... |
Additional arguments.
See |
The interactive geometry based on geom_beeswarm
.
Patrick Aboyoun
# Create NanoStringRccSet from data files datadir <- system.file("extdata", "3D_Bio_Example_Data", package = "NanoStringNCTools") rccs <- dir(datadir, pattern = "SKMEL.*\\.RCC$", full.names = TRUE) rlf <- file.path(datadir, "3D_SolidTumor_Sig.rlf") pheno <- file.path(datadir, "3D_SolidTumor_PhenoData.csv") solidTumor <- readNanoStringRccSet(rccs, rlfFile = rlf, phenoDataFile = pheno) eg_data <- as.data.frame(assayDataElement(solidTumor, "exprs")[1:5, 1]) eg_data[["tooltip"]] <- names(eg_data) geom_beeswarm_interactive(aes_string(tooltip = "tooltip"), data=eg_data)