tests/testthat/TestUseTry/R/notry.R

#' @export

fun <- function() {
  withCallingHandlers(
    signalCondition(simpleError("This Will Exit if `!isTRUE(use_try)`")),
    error = function(e) TRUE
  )
  1 + 1
  2 + 2
  "hello"
  "welcome"
  TRUE
}
r-lib/covr documentation built on Aug. 17, 2024, 6:21 p.m.