Skip to content

Commit ff12f37

Browse files
committed
notes for the future
1 parent f51324c commit ff12f37

File tree

2 files changed

+2
-0
lines changed

2 files changed

+2
-0
lines changed

R/plot-build.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -134,6 +134,7 @@ S7::method(build_ggplot, class_ggplot) <- function(plot, ...) {
134134
class_ggplot_built(data = data, layout = layout, plot = plot)
135135
}
136136

137+
# TODO: the S3 generic should be phased out once S7 is adopted more widely
137138
#' @rdname build_ggplot
138139
#' @export
139140
ggplot_build <- function(plot, ...) {

R/plot-construction.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -213,6 +213,7 @@ S7::method(update_ggplot, list(S7::new_S3_class("by"), class_ggplot)) <-
213213
ggplot_add(unclass(object), plot, object_name)
214214
}
215215

216+
# TODO: the S3 generic should be phased out once S7 is adopted more widely
216217
# For backward compatibility, ggplot_add still exists but by default it wraps
217218
# `update_ggplot()`
218219
#' @rdname update_ggplot

0 commit comments

Comments
 (0)