Skip to content

Commit b56afbe

Browse files
move '!' outside aggregation (#2067)
1 parent b40501a commit b56afbe

File tree

3 files changed

+3
-3
lines changed

3 files changed

+3
-3
lines changed

R/mock2.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -144,7 +144,7 @@ local_mocked_bindings <- function(..., .package = NULL, .env = caller_env()) {
144144
local_bindings_rebind(!!!bindings, .env = test_env, .frame = .env)
145145
}
146146

147-
if (any(!bindings_found)) {
147+
if (!all(bindings_found)) {
148148
missing <- names(bindings)[!bindings_found]
149149
cli::cli_abort("Can't find binding for {.arg {missing}}")
150150
}

R/reporter-list.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -126,7 +126,7 @@ all_passed <- function(res) {
126126
}
127127

128128
df <- as.data.frame.testthat_results(res)
129-
sum(df$failed) == 0 && all(!df$error)
129+
sum(df$failed) == 0 && !any(df$error)
130130
}
131131

132132
any_warnings <- function(res) {

vignettes/test-fixtures.Rmd

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -291,7 +291,7 @@ test_that("use_roxygen_md() adds DESCRIPTION fields", {
291291
use_roxygen_md()
292292
293293
expect_true(uses_roxygen_md())
294-
expect_equal(desc::desc_get("Roxygen", pkg)[[1]], "list(markdown = TRUE)"))
294+
expect_equal(desc::desc_get("Roxygen", pkg)[[1]], "list(markdown = TRUE)")
295295
expect_true(desc::desc_has_fields("RoxygenNote", pkg))
296296
})
297297
```

0 commit comments

Comments
 (0)