Skip to content

Commit

Permalink
Set default exercise debounce to 1s
Browse files Browse the repository at this point in the history
Co-authored-by: Garrick Aden-Buie <[email protected]>
  • Loading branch information
schloerke and gadenbuie authored Sep 4, 2024
1 parent 78d7960 commit 14fd95c
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/exercise.R
Original file line number Diff line number Diff line change
Expand Up @@ -34,7 +34,7 @@ setup_exercise_handler <- function(exercise_rx, session) {
rv <- reactiveValues(triggered = 0, result = NULL)

# debounce option to slow down successive exercise execution requests
debounce_s <- getOption("tutorial.exercise.debounce", 0) # value in seconds
debounce_s <- getOption("tutorial.exercise.debounce", 1) # in seconds
if (is.numeric(debounce_s) && debounce_s > 0) {
exercise_rx <- debounce(exercise_rx, debounce_s * 1000) # in milliseconds
}
Expand Down

0 comments on commit 14fd95c

Please sign in to comment.