Skip to content

Commit dc8f149

Browse files
drop safety valve (#2904)
1 parent 618a527 commit dc8f149

File tree

1 file changed

+0
-13
lines changed

1 file changed

+0
-13
lines changed

R/object_usage_linter.R

Lines changed: 0 additions & 13 deletions
Original file line numberDiff line numberDiff line change
@@ -246,19 +246,6 @@ parse_check_usage <- function(expression,
246246
)
247247
)
248248

249-
# nocov start
250-
is_missing <- is.na(res$message)
251-
if (any(is_missing)) {
252-
# TODO(#2474): Remove this.
253-
missing_msg <- vals[is_missing][[1L]] # nolint: object_usage_linter. TODO(#2252).
254-
cli_warn(c(
255-
x = "Couldn't parse usage message {.str {missing_msg}}. Ignoring {.val {sum(is_missing)}} usage warnings.",
256-
i = "Please report a possible bug at {.url https://github.com/r-lib/lintr/issues}."
257-
))
258-
}
259-
# nocov end
260-
res <- res[!is_missing, ]
261-
262249
res$line1 <- ifelse(
263250
nzchar(res$line1),
264251
as.integer(res$line1) + start_line - 1L,

0 commit comments

Comments
 (0)