Skip to content

Commit

Permalink
deal with crayon and R6
Browse files Browse the repository at this point in the history
  • Loading branch information
EmilHvitfeldt committed Jul 10, 2024
1 parent 0616813 commit f9b5f2e
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 1 deletion.
1 change: 1 addition & 0 deletions DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -21,6 +21,7 @@ Suggests:
jsonlite,
kknn,
parsnip,
R6,
recipes,
testthat (>= 3.0.0),
tidypredict,
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/helper-reporter.R
Original file line number Diff line number Diff line change
Expand Up @@ -49,7 +49,7 @@ PerformanceReporter <- R6::R6Class("PerformanceReporter",
# Capture at init so not affected by test settings
self$width <- cli::console_width()
self$unicode <- cli::is_utf8_output()
self$crayon <- crayon::has_color()
self$crayon <- function(x) cli::num_ansi_colors() > 1L

testthat_msg <- Sys.getenv("TESTTHAT_MSG")
if (testthat_msg != "") self$line(testthat_msg)
Expand Down

0 comments on commit f9b5f2e

Please sign in to comment.