Skip to content

Commit 29e08d3

Browse files
committed
Merge branch 'main' into revdep_deprecated_theme
2 parents b82fc4a + c68d9fc commit 29e08d3

38 files changed

+306
-303
lines changed

R/plot.R

Lines changed: 5 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -282,5 +282,8 @@ S7::method(convert, list(from = class_ggplot, to = S7::class_list)) <-
282282
}
283283
rm(`convert`)
284284

285-
S7::method(as.list, class_ggplot) <- function(x, ...) convert(x, S7::class_list)
286-
rm(`as.list`)
285+
# S7 currently attaches the S3 method to the calling environment which gives `ggplot2:::as.list`
286+
# Wrap in `local()` to provide a temp environment which throws away the attachment
287+
local({
288+
S7::method(as.list, class_ggplot) <- function(x, ...) convert(x, S7::class_list)
289+
})

R/theme-elements.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -33,7 +33,7 @@
3333
#' a blank element among its parents will cause this element to be blank as
3434
#' well. If `FALSE` any blank parent element will be ignored when
3535
#' calculating final element state.
36-
#' @return An S3 object of class `element`, `rel`, or `margin`.
36+
#' @return An object of class `element`, `rel`, or `margin`.
3737
#' @details
3838
#' The `element_polygon()` and `element_point()` functions are not rendered
3939
#' in standard plots and just serve as extension points.

R/utilities-help.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -34,7 +34,7 @@ rd_aesthetics_item <- function(x) {
3434
paste0("\\strong{\\code{", docs, "}}"),
3535
paste0("\\code{", docs, "}")
3636
)
37-
paste0(" \u2022 \\tab ", item, " \\tab ", defaults, " \\cr\\cr")
37+
paste0(" \u2022 \\tab ", item, " \\tab ", defaults, " \\cr")
3838
}
3939

4040
rd_defaults <- function(layer, aesthetics) {

man/element.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/geom_bar.Rd

Lines changed: 21 additions & 21 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/geom_bin_2d.Rd

Lines changed: 10 additions & 10 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/geom_boxplot.Rd

Lines changed: 16 additions & 16 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/geom_contour.Rd

Lines changed: 28 additions & 28 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/geom_count.Rd

Lines changed: 9 additions & 9 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/geom_density.Rd

Lines changed: 9 additions & 9 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)