1expect_no_error <- function(object, ...) {
2  expect_error({{ object }}, NA, ...)
3}
4expect_no_warning <- function(object, ...) {
5  expect_warning({{ object }}, NA, ...)
6}
7
8sig_caller_env <- function() {
9  signal(
10    "",
11    "dplyr:::test_caller_env",
12    out = peek_mask()$get_caller_env()
13  )
14}
15expect_caller_env <- function(expr) {
16  env <- catch_cnd(expr, "dplyr:::test_caller_env")$out
17  expect_equal(env, caller_env())
18}
19