Skip to content

Commit f87ea34

Browse files
authored
fix missing labels slot (#6010)
1 parent a33953f commit f87ea34

File tree

1 file changed

+2
-1
lines changed

1 file changed

+2
-1
lines changed

R/plot.R

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -130,7 +130,8 @@ ggplot.default <- function(data = NULL, mapping = aes(), ...,
130130
coordinates = coord_cartesian(default = TRUE),
131131
facet = facet_null(),
132132
plot_env = environment,
133-
layout = ggproto(NULL, Layout)
133+
layout = ggproto(NULL, Layout),
134+
labels = list()
134135
), class = c("gg", "ggplot"))
135136

136137
set_last_plot(p)

0 commit comments

Comments
 (0)