Skip to content

Commit ad3a9d3

Browse files
committed
Reformat with air
1 parent e862b8d commit ad3a9d3

File tree

6 files changed

+10
-10
lines changed

6 files changed

+10
-10
lines changed

R/expect-named.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -34,7 +34,7 @@ expect_named <- function(
3434
) {
3535
check_bool(ignore.order)
3636
check_bool(ignore.case)
37-
37+
3838
act <- quasi_label(enquo(object), label)
3939
act$names <- names(act$val)
4040

R/expect-output.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -31,7 +31,7 @@ expect_output <- function(
3131
width = 80
3232
) {
3333
check_number_whole(width, min = 1)
34-
34+
3535
act <- quasi_capture(enquo(object), label, capture_output, width = width)
3636

3737
if (identical(regexp, NA)) {

R/expect-vector.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -17,7 +17,7 @@
1717
expect_vector <- function(object, ptype = NULL, size = NULL) {
1818
check_installed("vctrs")
1919
check_number_whole(size, min = 0, allow_null = TRUE)
20-
20+
2121
act <- quasi_label(enquo(object))
2222

2323
message <- NULL

R/snapshot-file.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -97,7 +97,7 @@ expect_snapshot_file <- function(
9797
check_string(path)
9898
check_string(name)
9999
check_bool(cran)
100-
100+
101101
edition_require(3, "expect_snapshot_file()")
102102
if (!cran && on_cran()) {
103103
skip("On CRAN")

R/snapshot.R

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -71,7 +71,7 @@ expect_snapshot <- function(
7171
check_bool(cran)
7272
check_bool(error)
7373
check_bool(cnd_class)
74-
74+
7575
edition_require(3, "expect_snapshot()")
7676
variant <- check_variant(variant)
7777
if (!is.null(transform)) {
@@ -199,7 +199,7 @@ snap_header <- function(state, header) {
199199
#' @export
200200
expect_snapshot_output <- function(x, cran = FALSE, variant = NULL) {
201201
check_bool(cran)
202-
202+
203203
edition_require(3, "expect_snapshot_output()")
204204
variant <- check_variant(variant)
205205

@@ -232,7 +232,7 @@ expect_snapshot_error <- function(
232232
) {
233233
check_string(class)
234234
check_bool(cran)
235-
235+
236236
edition_require(3, "expect_snapshot_error()")
237237
expect_snapshot_condition_(
238238
"error",
@@ -253,7 +253,7 @@ expect_snapshot_warning <- function(
253253
) {
254254
check_string(class)
255255
check_bool(cran)
256-
256+
257257
edition_require(3, "expect_snapshot_warning()")
258258
expect_snapshot_condition_(
259259
"warning",

R/test-compiled-code.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -3,7 +3,7 @@
33
#' @export
44
expect_cpp_tests_pass <- function(package) {
55
check_string(package)
6-
6+
77
run_testthat_tests <- get_routine(package, "run_testthat_tests")
88

99
output <- ""
@@ -43,7 +43,7 @@ expect_cpp_tests_pass <- function(package) {
4343
#' @export
4444
run_cpp_tests <- function(package) {
4545
check_string(package)
46-
46+
4747
skip_on_os("solaris")
4848
check_installed("xml2", "to run run_cpp_tests()")
4949

0 commit comments

Comments
 (0)