Skip to content

Commit 8928d2c

Browse files
committed
use the new installExprFunction() instead of exprToFunction()
1 parent 25bd565 commit 8928d2c

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/shinywrappers.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -484,7 +484,7 @@ downloadHandler <- function(filename, content, contentType=NA) {
484484
#' @inheritParams renderPlot
485485
renderDataTable <- function(expr, options = NULL, searchDelay = 500,
486486
env=parent.frame(), quoted=FALSE) {
487-
func <- exprToFunction(expr, env, quoted)
487+
func <- installExprFunction(expr, "func", env, quoted)
488488

489489
function(shinysession, name, ...) {
490490
data <- func()

0 commit comments

Comments
 (0)