Skip to content

Commit 4c88efa

Browse files
committed
lol at my incompetence
1 parent eaeee6d commit 4c88efa

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

vignettes/ggplot2-in-packages.Rmd

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -114,7 +114,7 @@ col_summary <- function(df, col, by = NULL, fill = NULL, ...) {
114114
115115
optional <- list(fill = fill, ...)
116116
is_symbol <- lengths(optional) > 0
117-
optional <- c(data_syms(optional[is_symbol]), optional[!is_symbol])
117+
optional <- c(rlang::data_syms(optional[is_symbol]), optional[!is_symbol])
118118
119119
by <- if (!is.null(by)) facet_wrap(vars(.data[[by]]))
120120

0 commit comments

Comments
 (0)