inst/shiny/app/run_tests.R

library(testthat)
library(shinytest)

test_that("Application works", {
  # Use compareImages=FALSE, interactive=FALSE
  expect_pass(testApp(".", compareImages = FALSE, interactive = FALSE))
})
fmichelsendis/sendis documentation built on June 16, 2019, 7:30 a.m.