Nothing
## ------------------------------ plot.spca ------------------------------- ##
#' Show (s)pca explained variance plots
#'
#' @param x A \code{(s)pca} object
#' @param ncomp Integer, the number of components
#' @param type Character, default "barplot" or any other type available in plot, as "l","b","p",..
#' @param ... Not used
#' @author Kim-Anh Lê Cao, Florian Rohart, Leigh Coonan, Al J Abadi
#' @method plot pca
#' @export
plot.pca <- function(x,
ncomp = NULL,
type = "barplot",
# either barplot or any other type available in plot, as "l","b","p",..
...)
{
#-- checking general input parameters --------------------------------------#
#---------------------------------------------------------------------------#
#-- ncomp check
ncomp <- .check_ncomp(ncomp, X = x$X, default = x$ncomp)
## end check - begin screeplot
expl_vars = (x$prop_expl_var$X)[seq_len(ncomp)] # relative variance
ylab = "Explained Variance"
if (type == "barplot")
{
barplot(expl_vars, names.arg = seq_len(ncomp), xlab = "Principal Components", ylab = ylab,...)
} else {
plot(expl_vars, type = type, axes = FALSE,
xlab = "Principal Components",
ylab = ylab,... )
axis(1, at = seq_len(ncomp))
axis(2)
}
}
## ------------------------------- plot.rcc ------------------------------- ##
#' Canonical Correlations Plot
#'
#' This function provides scree plot of the canonical correlations.
#'
#' @inheritParams plot.pca
#' @param x object of class inheriting from \code{"rcc"}.
#' @return none
#' @author Sébastien Déjean, Ignacio González, Al J Abadi
#' @seealso \code{\link{points}}, \code{\link{barplot}}, \code{\link{par}}.
#' @keywords multivariate hplot
#' @method plot rcc
#' @examples
#' data(nutrimouse)
#' X <- nutrimouse$lipid
#' Y <- nutrimouse$gene
#' nutri.res <- rcc(X, Y, lambda1 = 0.064, lambda2 = 0.008)
#'
#' ## 'pointplot' type scree
#' plot(nutri.res) #(default)
#'
#' \dontrun{
#' plot(nutri.res, pch = 19, cex = 1.2,
#' col = c(rep("red", 3), rep("darkblue", 18)))
#'
#' ## 'barplot' type scree
#' plot(nutri.res, type = "barplot")
#'
#' plot(nutri.res, type = "barplot", density = 20, col = "black")
#' }
#'
#' @export
plot.rcc <-
function(x, type = "barplot", ...)
{
if (hasArg('scree.type')) {
stop("'scree.type' has been replaced by 'type'. See ?plot.rcc\n")
}
if (type == "barplot") {
barplot(x$cor, xlab = "Dimension", ylim = c(0, 1),
ylab = "Canonical correlation", ...)
}
else {
plot(x$cor, xlab = "Dimension", ylim = c(0, 1),
ylab = "Canonical correlation", type = type, ...)
}
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.