diff --git a/R/facet-grid-.r b/R/facet-grid-.r index 13d213ca1f..ae2fb50578 100644 --- a/R/facet-grid-.r +++ b/R/facet-grid-.r @@ -150,7 +150,7 @@ facet_grid <- function(rows = NULL, cols = NULL, scales = "fixed", stop("A grid facet specification can't have more than two dimensions", call. = FALSE) } if (n == 1L) { - rows <- quos() + rows <- rlang::quos() cols <- facets_list[[1]] } else { rows <- facets_list[[1]] @@ -182,12 +182,12 @@ grid_as_facets_list <- function(rows, cols) { } if (is.null(rows)) { - rows <- quos() + rows <- rlang::quos() } else { rows <- rlang::quos_auto_name(rows) } if (is.null(cols)) { - cols <- quos() + cols <- rlang::quos() } else { cols <- rlang::quos_auto_name(cols) } diff --git a/R/ggplot2.r b/R/ggplot2.r index 3e70041902..9cc72cc618 100644 --- a/R/ggplot2.r +++ b/R/ggplot2.r @@ -3,5 +3,4 @@ #' @import scales grid gtable #' @importFrom stats setNames -#' @importFrom rlang quo quos NULL