Skip to content
2 changes: 2 additions & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -66,6 +66,7 @@ S3method(ggplot_add,data.frame)
S3method(ggplot_add,default)
S3method(ggplot_add,labels)
S3method(ggplot_add,list)
S3method(ggplot_add,scale_params)
S3method(ggplot_add,theme)
S3method(ggplot_add,uneval)
S3method(ggplot_build,ggplot)
Expand Down Expand Up @@ -631,6 +632,7 @@ export(scale_linewidth_discrete)
export(scale_linewidth_identity)
export(scale_linewidth_manual)
export(scale_linewidth_ordinal)
export(scale_params)
export(scale_radius)
export(scale_shape)
export(scale_shape_binned)
Expand Down
7 changes: 7 additions & 0 deletions R/plot-construction.R
Original file line number Diff line number Diff line change
Expand Up @@ -143,6 +143,13 @@ ggplot_add.Scale <- function(object, plot, object_name) {
plot$scales$add(object)
plot
}

#' @export
ggplot_add.scale_params <- function(object, plot, object_name) {
plot$scales$add_params(object$aesthetics, object$params)
plot
}

#' @export
ggplot_add.labels <- function(object, plot, object_name) {
update_labels(plot, object)
Expand Down
Loading
Loading