Skip to content

Commit

Permalink
Only inject once, not once per TLE
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley committed Jun 18, 2024
1 parent 2d498ef commit 7393bb0
Showing 1 changed file with 1 addition and 2 deletions.
3 changes: 1 addition & 2 deletions R/eval.R
Original file line number Diff line number Diff line change
Expand Up @@ -67,6 +67,7 @@ evaluate <- function(input,
if (is.null(enclos)) {
enclos <- if (is.list(envir) || is.pairlist(envir)) parent.frame() else baseenv()
}
local_inject_funs(envir)

if (new_device) {
# Start new graphics device and clean up afterwards
Expand Down Expand Up @@ -238,8 +239,6 @@ evaluate_call <- function(call,
timing_fn <- function(x) {x; NULL};
}

local_inject_funs(envir)

user_handlers <- output_handler$calling_handlers

multi_args <- length(formals(value_handler)) > 1
Expand Down

0 comments on commit 7393bb0

Please sign in to comment.