R/assess_has_vignettes.R

Defines functions metric_score.pkg_metric_has_vignettes assess_has_vignettes.pkg_ref assess_has_vignettes

Documented in assess_has_vignettes metric_score.pkg_metric_has_vignettes

#' Assess a package for the presence of Vignettes files
#'
#' @eval roxygen_assess_family(
#'   "has_vignettes",
#'   "an integer value indicating the number of discovered vignettes files")
#'
#' @export
assess_has_vignettes <- function(x, ...) {
  UseMethod("assess_has_vignettes")
}

# assign a friendly name for assess column
attributes(assess_has_vignettes)$column_name <- "has_vignettes"
attributes(assess_has_vignettes)$label <- "number of discovered vignettes files"



#' @export
assess_has_vignettes.pkg_ref <- function(x, ...) {
  pkg_metric_eval(class = "pkg_metric_has_vignettes", {
    length(x$vignettes)
  })
}



#' Score a package for the presence of a Vignettes file
#'
#' Coerce the number of vignettes files to binary indication of valid Vignettes
#'
#' @eval roxygen_score_family("has_vignettes")
#' @return \code{1} if any Vignettes files are found, otherwise \code{0}
#'
#' @export
metric_score.pkg_metric_has_vignettes <- function(x, ...) {
  as.numeric(x > 0)
}

attributes(metric_score.pkg_metric_has_vignettes)$label <- 
  "A binary indicator of whether the package has any vignettes."
pharmaR/riskmetric documentation built on April 30, 2024, 5:14 p.m.