Skip to content

Commit 8fb433b

Browse files
committed
air whole package
1 parent 9bf3a81 commit 8fb433b

File tree

155 files changed

+4601
-3031
lines changed

Some content is hidden

Large Commits have some content hidden by default. Use the searchbox below for content that may be hidden.

155 files changed

+4601
-3031
lines changed

R/aaa-import-standalone-obj-type.R

Lines changed: 15 additions & 14 deletions
Original file line numberDiff line numberDiff line change
@@ -89,12 +89,11 @@ obj_type_friendly <- function(x, value = TRUE) {
8989
typeof(x),
9090
logical = "`NA`",
9191
integer = "an integer `NA`",
92-
double =
93-
if (is.nan(x)) {
94-
"`NaN`"
95-
} else {
96-
"a numeric `NA`"
97-
},
92+
double = if (is.nan(x)) {
93+
"`NaN`"
94+
} else {
95+
"a numeric `NA`"
96+
},
9897
complex = "a complex `NA`",
9998
character = "a character `NA`",
10099
.rlang_stop_unexpected_typeof(x)
@@ -296,14 +295,16 @@ obj_type_oo <- function(x) {
296295
#' @param ... Arguments passed to [abort()].
297296
#' @inheritParams args_error_context
298297
#' @noRd
299-
stop_input_type <- function(x,
300-
what,
301-
...,
302-
allow_na = FALSE,
303-
allow_null = FALSE,
304-
show_value = TRUE,
305-
arg = caller_arg(x),
306-
call = caller_env()) {
298+
stop_input_type <- function(
299+
x,
300+
what,
301+
...,
302+
allow_na = FALSE,
303+
allow_null = FALSE,
304+
show_value = TRUE,
305+
arg = caller_arg(x),
306+
call = caller_env()
307+
) {
307308
# From standalone-cli.R
308309
cli <- env_get_list(
309310
nms = c("format_arg", "format_code"),

0 commit comments

Comments
 (0)