output[["hot2"]] <- renderRHandsontable({
rhandsontable(head(iris)) %>%
hot_validate_numeric(col = 1, min = 0, max = 100)
})
The app works fine. But the shinytest script throws these errors:
> app$executeScript(script)
Error in session_makeRequest(self, private, endpoint, data, params, headers) :
undefined is not an object (evaluating 'HTMLWidgets.getInstance(hot1).hot')
> app$executeScript(script2)
Error in session_makeRequest(self, private, endpoint, data, params, headers) :
undefined is not an object (evaluating 'document.getElementById('hot2').htmlwidget_data_init_result.hot')
Hello,
The app:
The shinytest script:
No problem.
Now, replace
output[["hot2"]]
withThe app works fine. But the shinytest script throws these errors: