../vignettes/plotting.Rmd
plotting.Rmd
#> tweaking rgl
Reproducing the examples in this vignette.
All spectra used in this manual are installed automatically with package hyperSpec.
Terminology Throughout the documentation of the package, the following terms are used:
- wavelength indicates any type of spectral abscissa.
- intensity indicates any type of spectral ordinate.
- extra data indicates non-spectroscopic data.
library(hyperSpec) library(latticeExtra) library(deldir) library(ggplot2) # library(rgl) par(mar = c(4.1, 4.1, 1, .6)) set.seed(2020)
Besides, package tripack[1] is mentioned, but not used in this vignette.
For some plots of the faux_cell
dataset, the pre-processed spectra and their cluster averages \(\pm\) one standard deviation are more suitable:
set.seed(1) faux_cell <- generate_faux_cell() faux_cell_preproc <- faux_cell - spc.fit.poly.below(faux_cell) faux_cell_preproc <- faux_cell_preproc / rowMeans(faux_cell) faux_cell_preproc <- faux_cell_preproc - quantile(faux_cell_preproc, 0.05) cluster_cols <- c("dark blue", "orange", "#C02020") cluster_meansd <- aggregate(faux_cell_preproc, faux_cell$region, mean_pm_sd) cluster_means <- aggregate(faux_cell_preproc, faux_cell$region, mean)
Package hyperSpec comes with 6 major predefined plotting functions:
plot()
plotspc()
plotc()
plotc()
is a package lattice function)
levelplot()
levelplot()
.
More details in sections ??, and ??.
plotmat()
plotmap()
levelplot()
for map or image plots.
More details in sections ??, ??, and ??.
(plotmap()
is a package lattice function)
plotvoronoi()
plotmap()
that produces Voronoi tesselations.
More details in sections ??, and ??.
(plotvoronoi()
is a package lattice function)
NOTE. Functions plotmap()
, plotvoronoi()
, and levelplot()
are package lattice functions. Therefore, in loops, functions, R Markdown chunks, etc. lattice objects need to be printed explicitly by, e.g., print(plotmap(object))
(R FAQ: Why do lattice/trellis graphics not work?).
plotspc()
Function plotspc()
plots the spectra (Fig. 1), i.e., the intensities ($spc
) over the wavelengths (@wavelength
).
plotspc(flu)
plotmat()
Function plotmat()
plots the spectra, i.e., the colour coded intensities ($spc
) over the wavelengths (@wavelength
) and the row number (Fig. 2).
plotmat(flu)
plotc()
Function plotc()
plots an intensity over a single other data column, e.g., concentration (calibration plot, e.g., Fig. 3), depth (depth profile plot), or time (time series plot).
plotc(flu) #> Warning in plotc(flu): Intensity at first wavelengh only is used.
The following warning is expected:
Intensity at first wavelengh only is used.
levelplot()
Function levelplot()
plots a false colour map, defined by a formula (Fig. 39).
levelplot(spc ~ x * y, faux_cell[, , 1200], aspect = "iso")
The following warning is expected:
Only first wavelength is used for plotting
.
plotmap()
Function plotmap()
is a specialized version of levelplot()
.
It uses a single value (e.g., average intensity or cluster membership) over two data columns (default are $x
and $y
) to plot a false colour map (Fig. 5).
plotmap(faux_cell[, , 1200])
plotvoronoi()
Function plotvoronoi()
is a special version of plotmap()
that produces Voronoi diagram of the hyperSpec
object (Fig. 6).
plotvoronoi(sample(faux_cell, 300), region ~ x * y) #> #> PLEASE NOTE: The components "delsgs" and "summary" of the #> object returned by deldir() are now DATA FRAMES rather than #> matrices (as they were prior to release 0.0-18). #> See help("deldir"). #> #> PLEASE NOTE: The process that deldir() uses for determining #> duplicated points has changed from that used in version #> 0.0-9 of this package (and previously). See help("deldir").
plot()
The hyperSpec’s plot()
method uses its second argument to determine which of the specialized plots to produce.
This allows some handy abbreviations.
All further arguments are handed over to the function actually producing the plot.
"spcmeansd"
Command plot(x, "spcmeansd")
plots mean spectrum \(\pm\) 1 standard deviation (Fig. 8).
plot(faux_cell_preproc, "spcmeansd")
"spcprctile"
Code plot(x, "spcprctile")
plots median, 16th and 84th percentile for each wavelength (Fig. 9).
For Gaussian distributed data, 16th, 50th and 84th percentile are equal to mean \(\pm\) standard deviation.
Spectroscopic data frequently are not Gaussian distributed.
The percentiles give a better idea of the true distribution.
They are also less sensitive to outliers.
plot(faux_cell_preproc, "spcprctile")
"spcprctl5"
The code plot(x, "spcprctl5")
is like "spcprctile"
plus 5th and 95th percentile (Fig. 10).
plot(faux_cell_preproc, "spcprctl5")
"c"
Command plot(x, "c")
is equivalent to plotc(flu)
(Fig. 11).
plot(flu, "c") #> Warning in plotc(x, ...): Intensity at first wavelengh only is used.
"ts"
Function plot(x, "ts")
plots a time series plot and is equivalent to plotc(laser, spc ~ t)
(Fig. 12).
plot(laser[, , 405], "ts")
"depth"
Code plot(x, "depth")
plots a depth profile plot and is the same as plotc(laser, spc ~ z)
(Fig. 13).
depth.profile <- new("hyperSpec", spc = as.matrix(rnorm(20) + 1:20), data = data.frame(z = 1:20), labels = list( spc = "I / a.u.", z = expression(`/`(z, mu * m)), .wavelength = expression(lambda) ) ) plot(depth.profile, "depth")
"mat"
Code plot(x, "mat")
plots the spectra matrix (Fig. 14).
plot(laser, "mat")
The code is equivalent to:
plotmat(laser)
A lattice alternative is:
levelplot(spc ~ .wavelength * .row, data = laser)
"map"
Code plot(x, "map")
is equivalent to plotmap(faux_cell)
(Fig. 15).
plot(faux_cell[, , 1200], "map")
"voronoi"
Use plot(x, "voronoi")
for a Voronoi plot (Fig. 16).
See ?plotvoronoi
and ?latticeExtra::panel.voronoi
.
plotspc()
Function plotspc()
offers a variety of parameters for customized plots.
If only one wavelength range is needed (Fig. 17), the extract command is handiest.
plotspc(paracetamol[, , 700 ~ 1200])
Numbers connected with the tilde (~
) are interpreted as having the same units as the wavelengths.
If wl.range
already contains indices use wl.index = TRUE
.
For more details refer to vignette("hyperspec", package = "hyperSpec")
.
To plot severel wavelength ranges (Fig. 18), use wl.range = list (600 ~ 1800, 2800 ~ 3100)
.
Cut the wavelength axis appropriately with xoffset = 750
.
If available, the package package plotrix[4,5] is used to produce the cut mark.
To create a plot with reversed abscissa (Fig. 19), use wl.reverse = TRUE
plotspc(paracetamol, wl.reverse = TRUE)
To have different colours of spectra (Fig. 20), use col = vector_of_colours
.
plotspc(flu, col = matlab.dark.palette(6))
To plot dots instead of lines (Fig. 21), use, e.g., lines.args = list (pch = 20, type = "p")
To plot additional spectra onto an existing plot (Fig. 23), use add = TRUE
Argument func
may be used to calculate summary characteristics before plotting.
To plot, e.g., the standard deviation of the spectra, use plotspc(..., func = sd)
(Fig. 24).
plotspc(faux_cell_preproc, func = sd)
To plot a different line at zero intensity \((I = 0)\), argument zeroline
may be used (Fig. 25).
Argument zeroline
takes a list with parameters that are passed to function abline()
, NA
suppresses the line.
Function plotspc()
uses base graphics.
After plotting the spectra, more content may be added to the graphic by abline()
, lines()
, points()
, etc. (Fig. 26).
plot(laser, "spcmeansd") abline( v = c(405.0063, 405.1121, 405.2885, 405.3591), col = c("black", "blue", "red", "darkgreen") )
To stack spectra, use stacked = TRUE
(Fig. 27).
plotspc( cluster_means, col = cluster_cols, stacked = TRUE )
The spectra to be stacked can be grouped: stacked = "factor"
.
Alternatively, the name of an extra data column can be used for grouping (Fig. 28).
op <- par(las = 1, mgp = c(3.1, .7, 0)) plot( cluster_meansd, stacked = ".aggregate", fill = ".aggregate", col = cluster_cols )
yoffset
Stacking values can also be given manually as numeric values in yoffset
(Fig. 29).
It is possible to obtain a denser stacking (Fig. 30).
yoffsets <- apply(cluster_means[[]], 2, diff) yoffsets <- -apply(yoffsets, 1, min) plot(cluster_means, yoffset = c(0, cumsum(yoffsets)), col = cluster_cols )
Function plotspc()
allows fine grained customization of almost all aspects of the plot (see example in Fig. 31).
This is possible by giving arguments to the functions that actually perform the plotting plot()
for setting up the plot area, lines()
for the plotting of the lines, axis()
for the axes, etc.
The arguments for these functions should be given in lists as plot.args
, lines.args
, axis.args
, etc.
yoffset <- apply(faux_cell_preproc, 2, quantile, c(0.05, 0.95)) yoffset <- range(yoffset) plot(faux_cell_preproc[1], plot.args = list(ylim = c(0, 2) * yoffset), lines.args = list(type = "n") ) yoffset <- (0:1) * diff(yoffset) for (i in 1:3) { plot(faux_cell_preproc, "spcprctl5", yoffset = yoffset[i], col = "gray", add = TRUE ) plot(faux_cell_preproc[i], yoffset = yoffset[i], col = matlab.dark.palette(3) [i], add = TRUE, lines.args = list(lwd = 2) ) }
plotc()
Spectra intensities of one wavelength can be plotted over the concentration for univariate calibration (Fig. 32).
plotc(flu[, , 450])
The default is to use the first intensity only.
A function to compute a summary of the intensities before the drawing can be used via argument func
(Fig. 33).
plotc(flu, func = range, groups = .wavelength)
If func()
returns more than one value, the different results are accessible by .wavelength
.
Lattice conditioning (operator |
) can be used to plot more traces separately (Fig. 34).
Argument groups
may be used as a grouping parameter to plot more traces in one panel (Fig. 35).
Arguments of lattice function xyplot()
can be given to plotc()
(Fig. 36).
plotc(flu[, , 450], ylab = expression(I["450 nm"] / a.u.), xlim = range(0, flu$c + .01), ylim = range(0, flu$spc + 10), pch = 4 )
As plotc()
uses the package lattice function xyplot()
, additions to the plot must be made via the panel function (Fig. 37).
panelcalibration <- function(x, y, ..., clim = range(x), level = .95) { panel.xyplot(x, y, ...) lm <- lm(y ~ x) panel.abline(coef(lm), ...) cx <- seq(clim[1], clim[2], length.out = 50) cy <- predict(lm, data.frame(x = cx), interval = "confidence", level = level ) panel.lines(cx, cy[, 2], col = "gray") panel.lines(cx, cy[, 3], col = "gray") }
Abscissae other than c
may be specified by explicitly giving the model formula (Fig. 38).
plotc(laser[, , c(405.0063, 405.1121, 405.2885, 405.3591)], spc ~ t, groups = .wavelength, type = "b", col = c("black", "blue", "red", "darkgreen") )
levelplot()
Package hyperSpec’s function levelplot()
can use two special column names:
Besides that, it behaves exactly like lattice levelplot()
.
Particularly, the data is given as the second argument (Fig. 39).
levelplot(spc ~ x * y, data = faux_cell[, , 800])
If the colour-coded value is a factor, the display is adjusted to this fact (Fig. 40).
levelplot(region ~ x * y, data = faux_cell)
plotmat()
It is often useful to plot the spectra against an additional coordinate, e.g., the time for time
series, the depth for depth profiles, etc.
This can be done by plot(object, "mat")
.
The actual plotting is done by image()
, but levelplot()
can produce spectra matrix plots as well and these plots can be grouped or conditioned.
Argument col
can be used to provide a different colour palette (Fig. 41).
plot(laser, "mat", col = heat.colors(20))
This is the same as:
plotmat(laser, col = heat.colors(20))
Different extra data column can be used as y-axis (Fig. 42).
plotmat(laser, y = "t")
Alternatively, y values and axis label can be given separately.
Contour lines may also be added (Fig. 43).
plotmat(flu, col = matlab.dark.palette(20)) plotmat(flu, col = "white", contour = TRUE, add = TRUE)
In levelplot()
, colour-coded points may be set via special panel function (Fig. 44).
library("latticeExtra") barb <- collapse(barbiturates) barb <- orderwl(barb)
levelplot(spc ~ .wavelength * z, barb, panel = panel.levelplot.points, cex = .33, col.symbol = NA, col.regions = matlab.palette )
plotmap()
Function plotmap()
is a specialized version of levelplot()
(Fig. 47).
The spectral intensities may be summarized by a function before plotting (default: mean()
).
The same scale is used for x and y axes (aspect = "iso"
).
plotmap(faux_cell[, , 1200])
Specify the colour-coded variable, abscissa and ordinate as formula: colour.coded ~ abscissa * ordinate
(Fig. 46).
plotmap(faux_cell[, , 1200], spc ~ y * x)
The plotting of colour maps is done via R package lattice (aka Trellis graphic approach), which is highly customizable.
Use function trellis.par.get()
and trellis.par.set()
to get/set the settings for the current graphics device.
my_theme <- trellis.par.get() names(my_theme) # note how many parameters are tunable #> [1] "grid.pars" "fontsize" "background" "panel.background" #> [5] "clip" "add.line" "add.text" "plot.polygon" #> [9] "box.dot" "box.rectangle" "box.umbrella" "dot.line" #> [13] "dot.symbol" "plot.line" "plot.symbol" "reference.line" #> [17] "strip.background" "strip.shingle" "strip.border" "superpose.line" #> [21] "superpose.symbol" "superpose.polygon" "regions" "shade.colors" #> [25] "axis.line" "axis.text" "axis.components" "layout.heights" #> [29] "layout.widths" "box.3d" "par.xlab.text" "par.ylab.text" #> [33] "par.zlab.text" "par.main.text" "par.sub.text"
Any of these parameters can be fine-tuned to produce the desired output.
For example, parameter my_theme$region
is responsible for the appearance of color maps, and it contains elements $alpha
and $col
.
By changing these parameters you can create your own theme for plotting and pass it to the plotting function via par.settings
.
Fig. 49 uses a customized lattice theme.
my_theme$regions$col <- grDevices::terrain.colors plotmap(faux_cell[, , 1200], par.settings = my_theme)
It is possible to persistently (i.e. inside of the current R session) set lattice parameters, so they would apply to all further plots.
This is done via a call to trellis.par.set()
, for example trellis.par.set(my_theme)
.
The current settings can be visualized via a call to show.settings()
Graphical parameters for trellis may be displayed via show.settings()
(Fig. 50).
# Display current trellis parameters show.settings()
show.settings(my_theme)
An overview of different colour palettes, and ways to create your own, can be found in the R colour cheatsheet.
A map of the average intensity at particular wavelengths can be plotted if the wavelengths of interested are explicitly extracted (Fig. 51).
Logical conditions may be used to create subplots (Fig. 52).
plotmap( faux_cell[, , 1500], spc ~ y * x | x > 5, col.regions = matlab.palette(20) )
.wavelength
Function plotmap()
automatically applies the function in func
before plotting.
Argument func
defaults to function mean()
.
In order to suppress this, use func = NULL
.
This allows conditioning on the wavelengths.
Fig. 53 demonstrates an example to plot the maps of principal components scores.
pca <- prcomp(~spc, data = faux_cell_preproc$.) scores <- decomposition(faux_cell, pca$x, label.wavelength = "PC", label.spc = "score / a.u." ) plotmap( scores[, , 1:3], spc ~ y * x | as.factor(.wavelength), func = NULL, col.regions = matlab.palette(20) )
Alternatively, use levelplot()
directly (Fig. 54).
levelplot( spc ~ y * x | as.factor(.wavelength), scores[, , 1:3], aspect = "iso", col.regions = matlab.palette(20) )
Fig. 55 shows an example of a Voronoi plot.
Voronoi uses panel.voronoi()
from package latticeExtra[6].
The tesselation is calculated by default using package deldir[7], but package tripack[1] can also be used.
Package tripack seems to be faster in general, but may “hang” with certain data sets (particularly regular grids with missing spectra as in this example).
Furthermore, it is not FOSS (free and open-source software), so users are kindly asked to review package tripack’s license before using it.
plotvoronoi( sample(faux_cell, 300), region ~ x * y, col.regions = matlab.palette(20) )
If the spectra come from a rectangular grid, missing positions can be marked with the following panel function:
mark.missing <- function(x, y, z, ...) { panel.levelplot(x, y, z, ...) miss <- expand.grid(x = unique(x), y = unique(y)) miss <- merge(miss, data.frame(x, y, TRUE), all.x = TRUE) miss <- miss[is.na(miss[, 3]), ] panel.xyplot(miss[, 1], miss[, 2], pch = 4, ...) }
Fig. 56 shows the result.
plotmap(sample(faux_cell[, , 1200], length(faux_cell) - 20), col.regions = matlab.palette(20), col = "black", panel = mark.missing )
The panel function used by plotmap()
defaults to panel.levelplot.raster()
which assumes an evenly spaced measurement grid.
Even if the spectra are measured on a nominally evenly spaced grid, the actual stage position may slightly vary due to positioning inaccuracy and some manufacturers (e.g., Kaiser) record the position reported by the stage rather than the position requested by the stage control.
This leads to weird-looking output with holes, and possibly wrong columns (Fig. 57).
uneven <- faux_cell[, , 1200] uneven$x <- uneven$x + round(rnorm(nrow(uneven), sd = 0.05), digits = 1) uneven$y <- uneven$y + round(rnorm(nrow(uneven), sd = 0.05), digits = 1)
plotmap(uneven) #> Warning in (function (x, y, z, subscripts, at = pretty(z), ..., col.regions = regions$col, : 'x' #> values are not equispaced; output may be wrong #> Warning in (function (x, y, z, subscripts, at = pretty(z), ..., col.regions = regions$col, : 'y' #> values are not equispaced; output may be wrong
The symptom of this situation are warnings about values in x and/or y not being equispaced; and that the output, therefore, may be wrong.
One possibility to obtain a correct map is using plotvoronoi()
instead which will construct a mosaic-like image with the respective “pixel” areas being centred around the actually recorded $x
and $y
position (Fig. 58).
plotvoronoi(uneven)
Another possibility that underlines a point shape of the measurements is switching to latticeExtra::panel.levelplot.points()
(Fig. 59).
plotmap( uneven, panel = panel.levelplot.points, cex = 0.75, col.symbol = NA )
Alternatively, the measurement raster positions can be rounded to their nominal raster (e.g. Fig. 60).
rx <- makeraster(uneven$x, startx = -11.55, d = 1, tol = 0.3) uneven$x <- rx$x ry <- makeraster(uneven$y, startx = -4.77, d = 1, tol = 0.3) uneven$y <- ry$x plotmap(uneven)
Package rgl[8] offers fast 3d plotting in R. As package rgl’s axis annotations are sometimes awkward, they may better be set manually:
library(rgl) laser <- laser [, , 404.8 ~ 405.6] / 10000 laser$t <- laser$t / 3600 cols <- rep(matlab.palette(nrow(laser)), nwl(laser)) surface3d( y = wl(laser), x = laser$t, z = laser$spc, col = cols ) aspect3d(c(1, 1, 0.25)) axes3d(c("x+-", "y--", "z--")) axes3d("y--", nticks = 25, labels = FALSE) mtext3d("t / h", "x+-", line = 2.5) mtext3d("lambda / nm", "y--", line = 2.5) mtext3d("I / a.u.", edge = "z--", line = 2.5)
Package hyperSpec offers basic interaction, spc.identify()
for spectra plots, and map.identify()
and map.sel.poly()
for maps.
The first two identify points in spectra plots and map plots, respectively.
Function map.sel.poly()
selects the part of a hyperSpec
object that lies inside the user defined polygon.
spc.identify()
Finding Out Wavelength, Intensity and SpectrumFunction spc.identify()
allows to measure points in graphics produced by plotspc()
.
It works correctly with reversed and cut wavelength axes.
spc.identify(plotspc(paracetamol, wl.range = c(600 ~ 1800, 2800 ~ 3200), xoffset = 800))
The result is a data.frame with the indices of the spectra, the wavelength, and its intensity.
map.identify()
finding a spectrum in a map plotFunction map.identify()
returns the spectra indices of the clicked points.
map.identify(faux_cell[, , 1200])
map.sel.poly()
selecting spectra inside a polygon in a map plotFunction map.sel.poly()
returns a logical indicating which spectra are inside the polygon drawn by the user:
map.sel.poly(faux_cell[, , 1200])
For base graphics (as produced by plotspc()
), locator()
may be useful as well.
It returns the clicked coordinates. Note that these are not transformed according to xoffset
& Co.
For lattice graphics, grid.locator()
may be used instead.
If it is not called in the panel function, a preceding call to trellis.focus()
is needed:
plot(laser, "mat") trellis.focus() grid.locator()
Function identify()
(or panel.identify()
for lattice graphics) allows to identify points of the plot directly.
Note that the returned indices correspond to the plotted object.
Methods plotmap
, plotvoronoi
, levelplot
, and plotc
use package lattice functions.
Therefore, in loops, functions, Sweave, R Markdown chunks, etc. the lattice object needs to be printed explicitly by print(plotmap(object))
(R FAQ: Why do lattice/trellis graphics not work?).
The same holds for package ggplot2 graphics.
sessioninfo::session_info("hyperSpec") #> ─ Session info ─────────────────────────────────────────────────────────────────────────────────── #> setting value #> version R version 4.0.2 (2020-06-22) #> os macOS Catalina 10.15.6 #> system x86_64, darwin17.0 #> ui X11 #> language (EN) #> collate en_US.UTF-8 #> ctype en_US.UTF-8 #> tz UTC #> date 2020-08-11 #> #> ─ Packages ─────────────────────────────────────────────────────────────────────────────────────── #> package * version date lib source #> assertthat 0.2.1 2019-03-21 [1] CRAN (R 4.0.0) #> backports 1.1.8 2020-06-17 [1] CRAN (R 4.0.0) #> callr 3.4.3 2020-03-28 [1] CRAN (R 4.0.0) #> cli 2.0.2 2020-02-28 [1] CRAN (R 4.0.0) #> colorspace 1.4-1 2019-03-18 [1] CRAN (R 4.0.0) #> crayon 1.3.4 2017-09-16 [1] CRAN (R 4.0.0) #> desc 1.2.0 2018-05-01 [1] CRAN (R 4.0.0) #> digest 0.6.25 2020-02-23 [1] CRAN (R 4.0.0) #> dplyr 1.0.1 2020-07-31 [1] CRAN (R 4.0.2) #> ellipsis 0.3.1 2020-05-15 [1] CRAN (R 4.0.0) #> evaluate 0.14 2019-05-28 [1] CRAN (R 4.0.0) #> fansi 0.4.1 2020-01-08 [1] CRAN (R 4.0.0) #> farver 2.0.3 2020-01-16 [1] CRAN (R 4.0.0) #> generics 0.0.2 2018-11-29 [1] CRAN (R 4.0.0) #> ggplot2 * 3.3.2 2020-06-19 [1] CRAN (R 4.0.0) #> glue 1.4.1 2020-05-13 [1] CRAN (R 4.0.0) #> gtable 0.3.0 2019-03-25 [1] CRAN (R 4.0.0) #> hyperSpec * 0.99-20200728 2020-08-11 [1] local #> hySpc.testthat 0.2.1 2020-06-24 [1] CRAN (R 4.0.2) #> isoband 0.2.2 2020-06-20 [1] CRAN (R 4.0.1) #> jpeg 0.1-8.1 2019-10-24 [1] CRAN (R 4.0.0) #> labeling 0.3 2014-08-23 [1] CRAN (R 4.0.0) #> lattice * 0.20-41 2020-04-02 [2] CRAN (R 4.0.2) #> latticeExtra * 0.6-29 2019-12-19 [1] CRAN (R 4.0.0) #> lazyeval 0.2.2 2019-03-15 [1] CRAN (R 4.0.0) #> lifecycle 0.2.0 2020-03-06 [1] CRAN (R 4.0.0) #> magrittr 1.5 2014-11-22 [1] CRAN (R 4.0.0) #> MASS 7.3-51.6 2020-04-26 [2] CRAN (R 4.0.2) #> Matrix 1.2-18 2019-11-27 [2] CRAN (R 4.0.2) #> mgcv 1.8-31 2019-11-09 [2] CRAN (R 4.0.2) #> munsell 0.5.0 2018-06-12 [1] CRAN (R 4.0.0) #> nlme 3.1-148 2020-05-24 [2] CRAN (R 4.0.2) #> pillar 1.4.6 2020-07-10 [1] CRAN (R 4.0.2) #> pkgbuild 1.1.0 2020-07-13 [1] CRAN (R 4.0.2) #> pkgconfig 2.0.3 2019-09-22 [1] CRAN (R 4.0.0) #> pkgload 1.1.0 2020-05-29 [1] CRAN (R 4.0.0) #> png 0.1-7 2013-12-03 [1] CRAN (R 4.0.0) #> praise 1.0.0 2015-08-11 [1] CRAN (R 4.0.0) #> prettyunits 1.1.1 2020-01-24 [1] CRAN (R 4.0.0) #> processx 3.4.3 2020-07-05 [1] CRAN (R 4.0.2) #> ps 1.3.3 2020-05-08 [1] CRAN (R 4.0.0) #> purrr 0.3.4 2020-04-17 [1] CRAN (R 4.0.0) #> R6 2.4.1 2019-11-12 [1] CRAN (R 4.0.0) #> RColorBrewer 1.1-2 2014-12-07 [1] CRAN (R 4.0.0) #> rlang 0.4.7 2020-07-09 [1] CRAN (R 4.0.2) #> rprojroot 1.3-2 2018-01-03 [1] CRAN (R 4.0.0) #> rstudioapi 0.11 2020-02-07 [1] CRAN (R 4.0.0) #> scales 1.1.1 2020-05-11 [1] CRAN (R 4.0.0) #> testthat 2.3.2 2020-03-02 [1] CRAN (R 4.0.0) #> tibble 3.0.3 2020-07-10 [1] CRAN (R 4.0.2) #> tidyselect 1.1.0 2020-05-11 [1] CRAN (R 4.0.0) #> utf8 1.1.4 2018-05-24 [1] CRAN (R 4.0.0) #> vctrs 0.3.2 2020-07-15 [1] CRAN (R 4.0.2) #> viridisLite 0.3.0 2018-02-01 [1] CRAN (R 4.0.0) #> withr 2.2.0 2020-04-20 [1] CRAN (R 4.0.0) #> xml2 1.3.2 2020-04-23 [1] CRAN (R 4.0.0) #> #> [1] /Users/runner/work/_temp/Library #> [2] /Library/Frameworks/R.framework/Versions/4.0/Resources/library
[1] F. code by R. J. Renka. R functions by Albrecht Gebhardt. With contributions from Stephen Eglen <stephen@anc.ed.ac.uk>, S. Zuyev, D. White, Tripack: Triangulation of irregularly spaced data, 2020. https://CRAN.R-project.org/package=tripack.
[2] D. Sarkar, Lattice: Trellis graphics for r, 2020. https://CRAN.R-project.org/package=lattice.
[3] D. Sarkar, Lattice: Multivariate data visualization with r, Springer, New York, 2008. http://lmdvr.r-forge.r-project.org.
[4] J. Lemon, B. Bolker, S. Oom, E. Klein, B. Rowlingson, H. Wickham, A. Tyagi, O. Eterradossi, G. Grothendieck, M. Toews, J. Kane, R. Turner, C. Witthoft, J. Stander, T. Petzoldt, R. Duursma, E. Biancotto, O. Levy, C. Dutang, P. Solymos, R. Engelmann, M. Hecker, F. Steinbeck, H. Borchers, H. Singmann, T. Toal, D. Ogle, D. Baral, U. Groemping, B. Venables, Plotrix: Various plotting functions, 2020. https://CRAN.R-project.org/package=plotrix.
[5] L. J, Plotrix: A package in the red light district of r, R-News. 6 (2006) 8–12.
[6] D. Sarkar, F. Andrews, LatticeExtra: Extra graphical utilities based on lattice, 2019. https://CRAN.R-project.org/package=latticeExtra.
[7] R. Turner, Deldir: Delaunay triangulation and dirichlet (voronoi) tessellation, 2020. https://CRAN.R-project.org/package=deldir.
[8] D. Adler, D. Murdoch, Rgl: 3D visualization using opengl, 2020. https://CRAN.R-project.org/package=rgl.