tests/testthat/helper-facet.r

quos_list <- function(...) {
  x <- list(...)
  names(x) <- rlang::names2(x)
  structure(x, class = "quosures")
}
TomeTiger/ggplot2 documentation built on May 29, 2019, 7:53 a.m.