Skip to content

Commit fd760ce

Browse files
committed
don't use tibble() in code
1 parent fb33e26 commit fd760ce

File tree

2 files changed

+3
-3
lines changed

2 files changed

+3
-3
lines changed

R/facet-.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -533,7 +533,7 @@ is_facets <- function(x) {
533533
# but that seems like a reasonable tradeoff.
534534
eval_facets <- function(facets, data, possible_columns = NULL) {
535535
vars <- compact(lapply(facets, eval_facet, data, possible_columns = possible_columns))
536-
data_frame0(tibble::as_tibble(vars))
536+
data_frame0(!!!vars)
537537
}
538538
eval_facet <- function(facet, data, possible_columns = NULL) {
539539
# Treat the case when `facet` is a quosure of a symbol specifically

R/summarise-plot.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -66,7 +66,7 @@ summarise_layout = function(p) {
6666
l <- p$layout
6767

6868
layout <- l$layout
69-
layout <- tibble(
69+
layout <- data_frame0(
7070
panel = l$layout$PANEL,
7171
row = l$layout$ROW,
7272
col = l$layout$COL
@@ -134,7 +134,7 @@ summarise_layers <- function(p) {
134134

135135
# This currently only returns the mappings, but in the future, other
136136
# information could be added.
137-
tibble(
137+
data_frame0(
138138
mapping = layer_mappings
139139
)
140140
}

0 commit comments

Comments
 (0)