Skip to content

Commit 649b9f9

Browse files
Merge e61c5b0 into f6453b6
2 parents f6453b6 + e61c5b0 commit 649b9f9

File tree

1 file changed

+1
-2
lines changed

1 file changed

+1
-2
lines changed

R/is_lint_level.R

+1-2
Original file line numberDiff line numberDiff line change
@@ -19,9 +19,8 @@
1919
#'
2020
#' @export
2121
is_lint_level <- function(source_expression, level = c("expression", "file")) {
22-
stopifnot(!missing(level))
2322
level <- match.arg(level)
24-
required_key <- paste0(if (level == "file") "full_", "parsed_content")
23+
required_key <- switch(level, file = "full_parsed_content", expression = "parsed_content")
2524
required_key %in% names(source_expression)
2625
}
2726

0 commit comments

Comments
 (0)