# vdiffr ignores failures when
# - VDIFFR_RUN_TESTS is "false" (on Travis CI with older versions and dev version of R)
# - CI is not set (on CRAN)
# vdiffr:::print_plot.ggplot adds ggplot2::theme_test(), which destroys our theming defaults
registerS3method(
"print_plot", "ggplot", function(p, title = "") { print(p) },
envir = asNamespace("vdiffr")
)
expect_doppelganger <- function(name, p, ...) {
vdiffr::expect_doppelganger(name, p, ...)
}
# some plots have randomized output
set.seed(101)
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.