tidymodels / hardhat

Construct Modeling Packages
https://hardhat.tidymodels.org
Other
103 stars 17 forks source link

Missing snapshots #268

Closed hfrick closed 1 month ago

hfrick commented 1 month ago
library(tidyverse)

# https://github.com/r-lib/covr/issues/482
res_tbl <- devtools::test_coverage() |>
  purrr::map(~tibble(
    value = if_else(is.null(.x$value), NA, .x$value), 
    code = as.character(.x$srcref)
  )) |>
  purrr::list_rbind(names_to = "file")

res_tbl |>
  filter(value == 0, str_detect(code, "(cli_abort|cli_warn|cli_inform|abort|warn)")) |>
  arrange(file) |>
  mutate(file = str_extract(file, ".*?:.*?:")) |>
  mutate(file = str_remove(file, ":$")) |>
  pull(file) |>
  cat(sep = "\n")

gives

use.R:130
use.R:134
util.R:17

but the two in use.R are tested in https://github.com/tidymodels/hardhat/blob/92ad3919f982f751f206851d2b4b7ed6849056b9/tests/testthat/test-use.R#L64-L68 and for the one in util.R I opened #267