R/pin_exists.R

Defines functions check_pin_exists pin_exists

Documented in pin_exists

#' Determine if a pin exists
#'
#' @inheritParams pin_read
#' @export
pin_exists <- function(board, name, ...) {
  check_dots_used()
  UseMethod("pin_exists")
}

check_pin_exists <- function(board, name, call = caller_env()) {
  if (pin_exists(board, name)) {
    invisible()
  } else {
    abort_pin_missing(name, call = call)
  }
}
rstudio/pins documentation built on April 12, 2025, 6:59 p.m.