R/as_color_vctr.R

Defines functions as_color_vctr.color_vctr as_color_vctr.numeric as_color_vctr.default as_color_vctr

Documented in as_color_vctr

#' Coerce object to a color_vctr
#'
#' Coersion function for generation of a color_vctr from an existing vector
#'
#' @param x object to coerce
#' @param text_color A vector of length 1 or same length as vect. Details the
#'     color the text should be. Valid values can be found from the
#'     `valid_text_color()` function.NA means no text color.
#' @param background A vector of length 1 or same length as vect. Details the
#'     background color of the text. Valid values can be found from the
#'     `valid_background()` function. NA means no background color.
#' @param style A vector of length 1 or same length as vect. Details the
#'     style of the text Valid values can be found from the
#'     `valid_style()` function. NA means no styling.
#'
#' @export
as_color_vctr <- function(x, text_color = NA, background = NA, style = NA){
  UseMethod("as_color_vctr",x)
}

#' @export
as_color_vctr.default <- function(x, text_color = NA, background = NA, style = NA){
  stop(gettextf("cannot coerce class %s to a color_vctr",
                sQuote(deparse(class(x))[1L])), domain = NA)
}

#' @export
as_color_vctr.numeric <- function(x,text_color = NA, background = NA, style = NA){
  new_color_vctr(x,
                 text_color = text_color,
                 background = background,
                 style = style)
}

#' @export
as_color_vctr.color_vctr<- function(x,text_color = NA, background = NA, style = NA){
  x
}

#' @export
as_color_vctr.character <- as_color_vctr.numeric

#' @export
as_color_vctr.integer <- as_color_vctr.numeric

#' @export
as_color_vctr.logical <- as_color_vctr.numeric
thebioengineer/colortable documentation built on Sept. 2, 2020, 10:35 a.m.