R/name-check.R

Defines functions pkg_name_check

Documented in pkg_name_check

#' Check if an R package name is available
#'
#' @inherit pkgdepends::pkg_name_check description details return
#'
#' @inheritParams pkgdepends::pkg_name_check
#'
#' @export
#' @section Examples:
#' ```{asciicast pkg-name-check}
#' pkg_name_check("sicily")
#' ```

pkg_name_check <- function(name, dictionaries = NULL) {
  remote(
    function(...) {
      ret <- pkgdepends::pkg_name_check(...)
      asNamespace("pak")$pak_preformat(ret)
    },
    list(name, dictionaries)
  )
}
r-lib/pak documentation built on May 1, 2024, 11:16 a.m.