Nothing
#' @title Smart class to handle numerics as factor
#'
#' @description S3 class meant for representing numeric variables that act like
#' factor variables by taking only a few different values. This class
#' is used in makeDataReport() in order to get appropriate summaries, visualizations
#' and checks for such variables. In other words, such variables will be
#' treated like factor variables instead of numerics.
#'
#' @param v A numeric vector
#'
#' @return A \code{smartNum} object that is handled in \code{makeDataReport} in the same way as a factor.
#'
#' @export
smartNum <- function(v) {
oriClass <- class(v)
origLabel <- attr(v, "label", exact = TRUE)
origDesc <- attr(v, "shortDescription")
v <- factor(v)
attr(v, "label") <- origLabel
attr(v, "shortDescription") <- origDesc
attr(v, "originalClass") <- oriClass
class(v) <- c("smartNum", "factor")
v
}
#Get the original class of a smartNum or fakeLabelled object. Used in makeDataReport().
oClass <- function(v) UseMethod("oClass")
oClass.default <- function(v) {
oC <- attr(v, "orginalClass")
if (!is.null(oC)) return(oC)
else class(v)
}
oClass.smartNum <- function(v) attr(v, "originalClass")
oClass.fakeLabelled <- function(v) attr(v, "originalClass")
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.