tests/testthat/helper-facet.r

quos_list <- function(...) {
  x <- list(...)
  names(x) <- rlang::names2(x)
  structure(x, class = "quosures")
}
SahaRahul/ggplot2 documentation built on May 17, 2019, 1:46 p.m.