Skip to content

Commit

Permalink
Revert accidental change
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley committed Aug 2, 2023
1 parent 63246db commit 073e48e
Showing 1 changed file with 7 additions and 7 deletions.
14 changes: 7 additions & 7 deletions R/test.R
Original file line number Diff line number Diff line change
Expand Up @@ -128,15 +128,15 @@ test_coverage_active_file <- function(file = find_active_file(), filter = TRUE,

check_dots_used(action = getOption("devtools.ellipsis_action", rlang::warn))

withr::local_envvar(r_env_vars())
testthat::local_test_directory(pkg$path, pkg$package)
reporter <- testthat::local_snapshotter()
reporter$start_file(file, "test")
withr::local_envvar(r_env_vars())
testthat::local_test_directory(pkg$path, pkg$package)
reporter <- testthat::local_snapshotter()
reporter$start_file(file, "test")

env <- load_all(pkg$path, quiet = TRUE, export_all = export_all)$env
testthat::with_reporter(reporter, {
coverage <- covr::environment_coverage(env, test_files, ...)
})
testthat::with_reporter(reporter, {
coverage <- covr::environment_coverage(env, test_files, ...)
})

if (isTRUE(filter)) {
coverage_name <- name_source(covr::display_name(coverage))
Expand Down

0 comments on commit 073e48e

Please sign in to comment.