library(tidyverse)
defaultW <- getOption("warn")
options(warn = -1)
purrr::walk(params$custom_plot$plot, function(plot){
  print(plot)
  cat("\n")
})
options(warn = defaultW)


el-mrt/auto-statistics documentation built on March 19, 2022, 1:57 p.m.