Skip to content

Commit

Permalink
Make Superzip shinyloadtest-compatible
Browse files Browse the repository at this point in the history
  • Loading branch information
alandipert committed Nov 20, 2019
1 parent 4cecda5 commit e0bce15
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion 063-superzip-example/server.R
Expand Up @@ -176,7 +176,7 @@ function(input, output, session) {
is.null(input$zipcodes) | Zipcode %in% input$zipcodes
) %>%
mutate(Action = paste('<a class="go-map" href="" data-lat="', Lat, '" data-long="', Long, '" data-zip="', Zipcode, '"><i class="fa fa-crosshairs"></i></a>', sep=""))
action <- DT::dataTableAjax(session, df)
action <- DT::dataTableAjax(session, df, outputId = "ziptable")

DT::datatable(df, options = list(ajax = list(url = action)), escape = FALSE)
})
Expand Down

0 comments on commit e0bce15

Please sign in to comment.