Skip to content

Commit

Permalink
lintr
Browse files Browse the repository at this point in the history
  • Loading branch information
yjunechoe committed Sep 11, 2024
1 parent 26e04b4 commit 537c388
Showing 1 changed file with 2 additions and 1 deletion.
3 changes: 2 additions & 1 deletion R/interrogate.R
Original file line number Diff line number Diff line change
Expand Up @@ -2958,7 +2958,8 @@ pointblank_try_catch <- function(expr) {
invokeRestart("muffleWarning")
})

eval_list <- list(value = value, warning = warn, error = err, pb_call = call_fn)
eval_list <- list(value = value, warning = warn, error = err,
pb_call = call_fn)

class(eval_list) <- "table_eval"
eval_list
Expand Down

0 comments on commit 537c388

Please sign in to comment.