| plot-methods {Cardinal} | R Documentation |
Create and display plots for the feature data of an imaging dataset using a formula interface.
#### Methods for Cardinal >= 2.x classes ####
## S4 method for signature 'DataFrame,ANY'
plot(x, y, ...)
## S4 method for signature 'XDataFrame,missing'
plot(x, formula,
groups = NULL,
superpose = FALSE,
strip = TRUE,
key = superpose || !is.null(groups),
...,
xlab, xlim,
ylab, ylim,
layout,
col = discrete.colors,
breaks = "Sturges",
grid = FALSE,
jitter = FALSE,
subset = TRUE,
add = FALSE)
## S4 method for signature 'MassDataFrame,missing'
plot(x, ..., type = if (isCentroided(x)) "h" else "l")
## S4 method for signature 'SparseImagingExperiment,missing'
plot(x, formula,
pixel,
pixel.groups,
groups = NULL,
superpose = FALSE,
strip = TRUE,
key = superpose || !is.null(groups),
fun = mean,
hline = 0,
...,
xlab, xlim,
ylab, ylim,
layout,
col = discrete.colors,
grid = FALSE,
subset = TRUE,
add = FALSE)
## S4 method for signature 'MSImagingExperiment,missing'
plot(x, formula,
pixel = pixels(x, coord=coord, run=run),
pixel.groups,
coord,
run,
plusminus,
...,
xlab, ylab,
type = if ( is_centroided ) 'h' else 'l')
## S4 method for signature 'SparseImagingResult,missing'
plot(x, formula,
model = modelData(x),
superpose = is_matrix,
...,
column,
xlab, ylab,
type = 'h')
## S4 method for signature 'PCA2,missing'
plot(x, formula,
values = "loadings", ...)
## S4 method for signature 'PLS2,missing'
plot(x, formula,
values = c("coefficients", "loadings", "weights"), ...)
## S4 method for signature 'SpatialFastmap2,missing'
plot(x, formula,
values = "correlation", ...)
## S4 method for signature 'SpatialKMeans2,missing'
plot(x, formula,
values = c("centers", "correlation"), ...)
## S4 method for signature 'SpatialShrunkenCentroids2,missing'
plot(x, formula,
values = c("centers", "statistic", "sd"), ...)
## S4 method for signature 'SpatialDGMM,missing'
plot(x, model = modelData(x),
values = "density", type = 'l', ...)
## S4 method for signature 'MeansTest,missing'
plot(x, model = modelData(x),
values = "fixed", ...)
## S4 method for signature 'SegmentationTest,missing'
plot(x, model = modelData(x),
values = "fixed", ...)
## S4 method for signature 'AnnotatedImage,ANY'
plot(x, breaks = "Sturges",
key = TRUE, col,
add = FALSE, ...)
## S4 method for signature 'AnnotatedImageList,ANY'
plot(x, i, breaks = "Sturges",
strip = TRUE,
key = TRUE, col,
layout = !add,
add = FALSE, ...)
## S4 method for signature 'AnnotatedImagingExperiment,ANY'
plot(x, i, ...)
#### Methods for Cardinal 1.x classes ####
## S4 method for signature 'SImageSet,missing'
plot(x, formula = ~ Feature,
pixel,
pixel.groups,
groups = NULL,
superpose = FALSE,
strip = TRUE,
key = FALSE,
fun = mean,
...,
xlab,
xlim,
ylab,
ylim,
layout,
type = 'l',
col = "black",
subset = TRUE,
lattice = FALSE)
## S4 method for signature 'MSImageSet,missing'
plot(x, formula = ~ mz,
pixel = pixels(x, coord=coord),
pixel.groups,
coord,
plusminus,
...,
type = if (centroided(x)) 'h' else 'l')
## S4 method for signature 'ResultSet,missing'
plot(x, formula,
model = pData(modelData(x)),
pixel,
pixel.groups,
superpose = TRUE,
strip = TRUE,
key = superpose,
...,
xlab,
ylab,
column,
col = if (superpose) rainbow(nlevels(pixel.groups)) else "black",
lattice = FALSE)
## S4 method for signature 'CrossValidated,missing'
plot(x, fold = 1:length(x), layout, ...)
## S4 method for signature 'PCA,missing'
plot(x, formula = substitute(mode ~ mz),
mode = "loadings",
type = 'h',
...)
## S4 method for signature 'PLS,missing'
plot(x, formula = substitute(mode ~ mz),
mode = c("coefficients", "loadings",
"weights", "projection"),
type = 'h',
...)
## S4 method for signature 'OPLS,missing'
plot(x, formula = substitute(mode ~ mz),
mode = c("coefficients", "loadings", "Oloadings",
"weights", "Oweights", "projection"),
type = 'h',
...)
## S4 method for signature 'SpatialFastmap,missing'
plot(x, formula = substitute(mode ~ mz),
mode = "correlation",
type = 'h',
...)
## S4 method for signature 'SpatialShrunkenCentroids,missing'
plot(x, formula = substitute(mode ~ mz),
mode = c("centers", "tstatistics"),
type = 'h',
...)
## S4 method for signature 'SpatialKMeans,missing'
plot(x, formula = substitute(mode ~ mz),
mode = c("centers", "betweenss", "withinss"),
type = 'h',
...)
x |
An imaging dataset. |
formula, y |
A formula of the form 'y ~ x | g1 * g2 * ...' (or equivalently, 'y ~ x | g1 + g2 + ...'), indicating a LHS 'y' (on the y-axis) versus a RHS 'x' (on the x-axis) and conditioning variables 'g1, g2, ...'. Usually, the LHS is not supplied, and the formula is of the form '~ x | g1 * g2 * ...', and the y-axis is implicityl assumed to be the feature vectors corresponding to each pixel in the imaging dataset specified by the object 'x'. However, a variable evaluating to a feature vector, or a sequence of such variables, can also be supplied. The RHS is evaluated in The conditioning variables are evaluated in |
coord |
A named vector or list giving the coordinate(s) of the pixel(s) to plot. |
run |
A character, factor, or integer vector giving the run(s) of the pixel(s) to plot. |
plusminus |
If specified, a window of pixels surrounding the one given by |
pixel |
The pixel or vector of pixels for which to plot the feature vectors. This is an expression that evaluates to a logical or integer indexing vector. |
pixel.groups |
An alternative way to express a single conditioning variable. This is a variable or expression to be evaluated in |
groups |
A variable or expression to be evaluated in |
superpose |
Should feature vectors from different pixel groups specified by 'pixel.groups' be superposed on the same plot? |
strip |
Should strip labels indicating the plotting group be plotting along with the each panel? Passed to 'strip' in |
key |
A logical, or |
fun |
A function to apply over feature vectors grouped together by 'pixel.groups'. By default, this is used for averaging over pixels. |
hline |
The y-value(s) for a horizontal reference line(s). |
xlab |
Character or expression giving the label for the x-axis. |
ylab |
Character or expression giving the label for the x-axis. |
xlim |
A numeric vector of length 2 giving the left and right limits for the x-axis. |
ylim |
A numeric vector of length 2 giving the lower and upper limits for the y-axis. |
layout |
The layout of the plots, given by a length 2 numeric as |
col |
A specification for the default plotting color(s). |
type |
A character indicating the type of plotting. |
grid |
Should a grid be added to the plot? |
jitter |
Should a small amount of noise be added to numeric variables before plotting them? |
breaks |
The number of breaks when plotting a histogram. |
subset |
An expression that evaluates to a logical or integer indexing vector to be evaluated in |
... |
Additional arguments passed to the underlying |
i |
Which data element should be plotted. |
fold |
What folds of the cross-validation should be plotted. |
model |
A vector or |
mode |
What kind of results should be plotted. This is the name of the object to plot in the |
values |
What kind of results should be plotted. This is the name of the object to plot in the |
column |
What columns of the results should be plotted. If the results are a matrix, this corresponds to the columns to be plotted, which can be indicated either by numeric index or by name. |
lattice |
Should lattice graphics be used to create the plot? |
add |
Should the method call |
Kylie A. Bemis
setCardinalBPPARAM(SerialParam())
set.seed(1)
x <- simulateImage(preset=2, npeaks=10, dim=c(10,10))
m <- mz(metadata(x)$design$featureData)
plot(x, pixel=23)
plot(x, coord=c(x=3, y=3), plusminus=1)
plot(x, coord=c(x=3, y=3), groups=mz > 1000)
plot(x, coord=c(x=7, y=7), superpose=TRUE)
sm <- summarizeFeatures(x, FUN=c("mean", "sd"), as="DataFrame")
featureData(x)$mean <- sm$mean
featureData(x)$sd <- sm$sd
plot(x, mean + I(-sd) ~ mz, superpose=TRUE)