File tree 2 files changed +4
-5
lines changed
2 files changed +4
-5
lines changed Original file line number Diff line number Diff line change @@ -54,7 +54,7 @@ sanitize_call <- function(cnd) {
54
54
if (identical(cnd $ call , quote(withVisible(do )))) {
55
55
cnd $ call <- NULL
56
56
}
57
- if (identical(cnd $ call , quote(eval(as.call(list (cb )), envir )))) {
57
+ if (identical(cnd $ call , quote(eval(as.call(list (context )), envir )))) {
58
58
cnd $ call <- NULL
59
59
}
60
60
Original file line number Diff line number Diff line change @@ -121,8 +121,7 @@ evaluate <- function(input,
121
121
envir <- list2env(envir , parent = enclos %|| % parent.frame())
122
122
}
123
123
local_inject_funs(envir )
124
-
125
-
124
+
126
125
# Handlers for warnings, errors and messages
127
126
user_handlers <- output_handler $ calling_handlers
128
127
evaluate_handlers <- condition_handlers(
@@ -134,7 +133,7 @@ evaluate <- function(input,
134
133
# The user's condition handlers have priority over ours
135
134
handlers <- c(user_handlers , evaluate_handlers )
136
135
137
- cb <- function () {
136
+ context <- function () {
138
137
do <- NULL # silence R CMD check note
139
138
140
139
for (tle in tles ) {
@@ -174,7 +173,7 @@ evaluate <- function(input,
174
173
175
174
# Here we use `eval()` to create an unwinding scope for `envir`.
176
175
# We call ourselves back immediately once the scope is created.
177
- eval(as.call(list (cb )), envir )
176
+ eval(as.call(list (context )), envir )
178
177
watcher $ capture_output()
179
178
180
179
# Always capture last plot, even if incomplete
You can’t perform that action at this time.
0 commit comments