Skip to content

Commit 131ae89

Browse files
drop escape valve (#2989)
Co-authored-by: Indrajeet Patil <[email protected]>
1 parent 823728b commit 131ae89

File tree

1 file changed

+1
-11
lines changed

1 file changed

+1
-11
lines changed

R/shared_constants.R

Lines changed: 1 addition & 11 deletions
Original file line numberDiff line numberDiff line change
@@ -280,9 +280,7 @@ extract_glued_symbols <- function(expr, interpret_glue = TRUE) {
280280

281281
glued_symbols <- new.env(parent = emptyenv())
282282
for (glue_call in glue_calls) {
283-
# TODO(#2475): Drop tryCatch().
284-
parsed_call <-
285-
tryCatch(xml2lang(glue_call), error = unexpected_glue_parse_error, warning = unexpected_glue_parse_error)
283+
parsed_call <- xml2lang(glue_call)
286284
parsed_call[[".envir"]] <- glued_symbols
287285
parsed_call[[".transformer"]] <- glue_symbol_extractor
288286
# #1459: syntax errors in glue'd code are ignored with warning, rather than crashing lint
@@ -291,14 +289,6 @@ extract_glued_symbols <- function(expr, interpret_glue = TRUE) {
291289
names(glued_symbols)
292290
}
293291

294-
unexpected_glue_parse_error <- function(cond) {
295-
# nocov start
296-
cli_abort(c(
297-
x = "Unexpected failure to parse glue call.",
298-
i = "Please report: {conditionMessage(cond)}"
299-
))
300-
# nocov end
301-
}
302292
glue_parse_failure_warning <- function(cond) {
303293
cli_warn(c(
304294
x = "Evaluating glue expression while testing for local variable usage failed: {conditionMessage(cond)}",

0 commit comments

Comments
 (0)