Skip to content

Commit 218f3f1

Browse files
use cli_abort
Co-authored-by: Hadley Wickham <[email protected]>
1 parent 9ecb52b commit 218f3f1

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/skip.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -133,7 +133,7 @@ package_version <- function(x) {
133133
skip_unless_r <- function(spec) {
134134
parts <- unlist(strsplit(spec, " ", fixed = TRUE))
135135
if (length(parts) != 2L) {
136-
abort("`spec` should be a comparison like '>=' and an R version.")
136+
cli::cli_abort("{.arg spec} should be a comparison like '>=' and an R version separated by a space.")
137137
}
138138
comparator <- match.fun(parts[1L])
139139
required_version <- numeric_version(parts[2L])

0 commit comments

Comments
 (0)