R/assertions.R

Defines functions is_header is_input_id

#' @importFrom assertthat assert_that on_failure<-

is_input_id <- function(x) {
  is.null(x) || (is.character(x) && length(x) == 1 && !is.na(x))
}

on_failure(is_input_id) <- function(call, env) {
  paste0(deparse(call$x), " is not a string (length 1 character)")
}

#  --------------------------------------------------------------------


is_header <- function(x) {
  is.null(x) || (length(x) == 1 && (is.na(x) || is.character(x)))
}

on_failure(is_header) <- function(call, env) {
  paste0(deparse(call$x), " must be NULL or a string with at least 1 character")
}


# -------------------------------------------------------------------------
rstudio/sortable documentation built on April 5, 2024, 8:45 a.m.