tests/testthat/misc.R

library(testthat)
library(shinymodels)

test_that("can format hover correctly", {
  expect_equal(length(format_hover(mtcars)), 32)
  expect_equal(is.character(format_hover(mtcars)), TRUE)
  expect_snapshot(
    error = TRUE,
    format_hover()
  )
})
tidymodels/shinymodels documentation built on Oct. 25, 2024, 11:23 p.m.