Nothing
# --------------------------------------
# Author: Andreas Alfons
# Erasmus Universiteit Rotterdam
# --------------------------------------
#' Access or set information on cross-validation results
#'
#' Retrieve or set the names of cross-validation results, retrieve or set the
#' identifiers of the models, or retrieve the number of cross-validation
#' results or included models.
#'
#' @rdname accessors
#' @name accessors
#'
#' @param x an object inheriting from class \code{"cv"} or \code{"cvSelect"}
#' that contains cross-validation results.
#' @param value a vector of replacement values.
#'
#' @return
#' \code{cvNames} returns the names of the cross-validation results. The
#' replacement function thereby returns them invisibly.
#'
#' \code{fits} returns the identifiers of the models for objects inheriting
#' from class \code{"cvSelect"} and \code{NULL} for objects inheriting from
#' class \code{"cv"}. The replacement function thereby returns those values
#' invisibly.
#'
#' \code{ncv} returns the number of cross-validation results.
#'
#' \code{nfits} returns the number of models included in objects inheriting
#' from class \code{"cvSelect"} and \code{NULL} for objects inheriting from
#' class \code{"cv"}.
#'
#' @author Andreas Alfons
#'
#' @seealso \code{\link{cvFit}}, \code{\link{cvSelect}}, \code{\link{cvTuning}}
#'
#' @example inst/doc/examples/example-accessors.R
#'
#' @keywords utilities
NULL
#' @rdname accessors
#' @export
cvNames <- function(x) UseMethod("cvNames")
#' @method cvNames cv
#' @export
cvNames.cv <- function(x) names(x$cv)
#' @method cvNames cvSelect
#' @export
cvNames.cvSelect <- function(x) names(x$cv)[-1]
#' @rdname accessors
#' @usage cvNames(x) <- value
#' @export
"cvNames<-" <- function(x, value) UseMethod("cvNames<-")
#' @method cvNames<- cv
#' @export
"cvNames<-.cv" <- function(x, value) {
object <- x
names(object$cv) <- names(object$se) <- value
if(!is.null(x$reps)) colnames(object$reps) <- value
eval.parent(substitute(x <- object))
}
#' @method cvNames<- cvSelect
#' @export
"cvNames<-.cvSelect" <- function(x, value) {
object <- x
names(object$best) <- value
value <- c("Fit", value)
names(object$cv) <- names(object$se) <- value
if(!is.null(x$reps)) names(object$reps) <- value
eval.parent(substitute(x <- object))
}
#' @rdname accessors
#' @export
fits <- function(x) UseMethod("fits")
#' @method fits cv
#' @export
fits.cv <- function(x) NULL
#' @method fits cvSelect
#' @export
fits.cvSelect <- function(x) x$cv$Fit
#' @rdname accessors
#' @usage fits(x) <- value
#' @export
"fits<-" <- function(x, value) UseMethod("fits<-")
#' @method fits<- cv
#' @export
"fits<-.cv" <- function(x, value) eval.parent(substitute(x))
#' @method fits<- cvSelect
#' @export
"fits<-.cvSelect" <- function(x, value) {
object <- x
if(is.factor(value)) value <- factor(as.character(value), levels=value)
object$cv$Fit <- object$se$Fit <- value
if(!is.null(reps <- x$reps)) {
indices <- match(reps$Fit, x$cv$Fit, nomatch=0)
object$reps$Fit <- value[indices]
}
eval.parent(substitute(x <- object))
}
#' @rdname accessors
#' @export
ncv <- function(x) UseMethod("ncv")
#' @method ncv cv
#' @export
ncv.cv <- function(x) length(x$cv)
#' @method ncv cvSelect
#' @export
ncv.cvSelect <- function(x) ncol(x$cv) - 1
#' @rdname accessors
#' @export
nfits <- function(x) UseMethod("nfits")
#' @method nfits cv
#' @export
nfits.cv <- function(x) nrow(x$cv)
#' @method nfits cvSelect
#' @export
nfits.cvSelect <- function(x) nrow(x$cv)
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.