Skip to content

Commit 21afc10

Browse files
authored
Merge branch 'main' into no_ticks_no_space
2 parents 895d5b2 + 1bb9230 commit 21afc10

File tree

318 files changed

+40322
-7334
lines changed

Some content is hidden

Large Commits have some content hidden by default. Use the searchbox below for content that may be hidden.

318 files changed

+40322
-7334
lines changed

.github/workflows/R-CMD-check.yaml

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -63,7 +63,7 @@ jobs:
6363
cache-version: 3
6464
extra-packages: >
6565
any::rcmdcheck,
66-
Hmisc=?ignore-before-r=4.1.0,
66+
Hmisc=?ignore-before-r=4.2.0,
6767
quantreg=?ignore-before-r=4.3.0
6868
needs: check
6969

DESCRIPTION

Lines changed: 7 additions & 8 deletions
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
Package: ggplot2
2-
Version: 3.5.1.9000
32
Title: Create Elegant Data Visualisations Using the Grammar of Graphics
3+
Version: 3.5.1.9000
44
Authors@R: c(
55
person("Hadley", "Wickham", , "[email protected]", role = "aut",
66
comment = c(ORCID = "0000-0003-4757-117X")),
@@ -30,21 +30,21 @@ License: MIT + file LICENSE
3030
URL: https://ggplot2.tidyverse.org, https://github.com/tidyverse/ggplot2
3131
BugReports: https://github.com/tidyverse/ggplot2/issues
3232
Depends:
33-
R (>= 3.5)
33+
R (>= 4.0)
3434
Imports:
3535
cli,
3636
grDevices,
3737
grid,
3838
gtable (>= 0.1.1),
3939
isoband,
4040
lifecycle (> 1.0.1),
41-
MASS,
4241
rlang (>= 1.1.0),
4342
scales (>= 1.3.0),
4443
stats,
4544
vctrs (>= 0.6.0),
4645
withr (>= 2.5.0)
4746
Suggests:
47+
broom,
4848
covr,
4949
dplyr,
5050
ggplot2movies,
@@ -53,6 +53,7 @@ Suggests:
5353
knitr,
5454
mapproj,
5555
maps,
56+
MASS,
5657
mgcv,
5758
multcomp,
5859
munsell,
@@ -75,6 +76,7 @@ VignetteBuilder:
7576
knitr
7677
Config/Needs/website: ggtext, tidyr, forcats, tidyverse/tidytemplate
7778
Config/testthat/edition: 3
79+
Config/usethis/last-upkeep: 2024-10-24
7880
Encoding: UTF-8
7981
LazyData: true
8082
Roxygen: list(markdown = TRUE)
@@ -125,15 +127,15 @@ Collate:
125127
'facet-grid-.R'
126128
'facet-null.R'
127129
'facet-wrap.R'
128-
'fortify-lm.R'
129130
'fortify-map.R'
130-
'fortify-multcomp.R'
131+
'fortify-models.R'
131132
'fortify-spatial.R'
132133
'fortify.R'
133134
'stat-.R'
134135
'geom-abline.R'
135136
'geom-rect.R'
136137
'geom-bar.R'
138+
'geom-tile.R'
137139
'geom-bin2d.R'
138140
'geom-blank.R'
139141
'geom-boxplot.R'
@@ -150,7 +152,6 @@ Collate:
150152
'geom-density2d.R'
151153
'geom-dotplot.R'
152154
'geom-errorbar.R'
153-
'geom-errorbarh.R'
154155
'geom-freqpoly.R'
155156
'geom-function.R'
156157
'geom-hex.R'
@@ -167,7 +168,6 @@ Collate:
167168
'geom-smooth.R'
168169
'geom-spoke.R'
169170
'geom-text.R'
170-
'geom-tile.R'
171171
'geom-violin.R'
172172
'geom-vline.R'
173173
'ggplot2-package.R'
@@ -276,7 +276,6 @@ Collate:
276276
'utilities-break.R'
277277
'utilities-grid.R'
278278
'utilities-help.R'
279-
'utilities-matrix.R'
280279
'utilities-patterns.R'
281280
'utilities-resolution.R'
282281
'utilities-tidy-eval.R'

LICENSE.md

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
# MIT License
22

3-
Copyright (c) 2020 ggplot2 authors
3+
Copyright (c) 2024 ggplot2 core developer team
44

55
Permission is hereby granted, free of charge, to any person obtaining a copy
66
of this software and associated documentation files (the "Software"), to deal

NAMESPACE

Lines changed: 15 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -84,8 +84,6 @@ S3method(guide_train,default)
8484
S3method(guide_transform,default)
8585
S3method(heightDetails,titleGrob)
8686
S3method(heightDetails,zeroGrob)
87-
S3method(interleave,default)
88-
S3method(interleave,unit)
8987
S3method(limits,Date)
9088
S3method(limits,POSIXct)
9189
S3method(limits,POSIXlt)
@@ -126,8 +124,6 @@ S3method(scale_type,logical)
126124
S3method(scale_type,numeric)
127125
S3method(scale_type,ordered)
128126
S3method(scale_type,sfc)
129-
S3method(single_value,default)
130-
S3method(single_value,factor)
131127
S3method(summary,ggplot)
132128
S3method(vec_cast,character.mapped_discrete)
133129
S3method(vec_cast,double.mapped_discrete)
@@ -176,6 +172,7 @@ export(GeomAbline)
176172
export(GeomAnnotationMap)
177173
export(GeomArea)
178174
export(GeomBar)
175+
export(GeomBin2d)
179176
export(GeomBlank)
180177
export(GeomBoxplot)
181178
export(GeomCol)
@@ -426,6 +423,7 @@ export(get_alt_text)
426423
export(get_element_tree)
427424
export(get_geom_defaults)
428425
export(get_guide_data)
426+
export(get_labs)
429427
export(get_last_plot)
430428
export(get_layer_data)
431429
export(get_layer_grob)
@@ -463,10 +461,22 @@ export(guide_transform)
463461
export(guides)
464462
export(has_flipped_aes)
465463
export(is.Coord)
464+
export(is.coord)
466465
export(is.facet)
466+
export(is.geom)
467467
export(is.ggplot)
468468
export(is.ggproto)
469+
export(is.guide)
470+
export(is.guides)
471+
export(is.layer)
472+
export(is.mapping)
473+
export(is.margin)
474+
export(is.position)
475+
export(is.scale)
476+
export(is.stat)
469477
export(is.theme)
478+
export(is.theme_element)
479+
export(is.waiver)
470480
export(label_both)
471481
export(label_bquote)
472482
export(label_context)
@@ -711,6 +721,7 @@ export(theme_minimal)
711721
export(theme_replace)
712722
export(theme_set)
713723
export(theme_test)
724+
export(theme_transparent)
714725
export(theme_update)
715726
export(theme_void)
716727
export(transform_position)

NEWS.md

Lines changed: 45 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,41 @@
11
# ggplot2 (development version)
22

3-
* `guide_axis()` no longer reserves space for blank ticks
4-
(@teunbrand, #4722, #6069).
3+
* Binned guides now accept expressions as labels (@teunbrand, #6005)
4+
* (internal) `Scale$get_labels()` format expressions as lists.
5+
* In non-orthogonal coordinate systems (`coord_sf()`, `coord_polar()` and
6+
`coord_radial()`), using 'AsIs' variables escape transformation when
7+
both `x` and `y` is an 'AsIs' variable (@teunbrand, #6205).
8+
* The following methods have been deprecated: `fortify.lm()`, `fortify.glht()`,
9+
`fortify.confint.glht()`, `fortify.summary.glht()` and `fortify.cld()`. It
10+
is recommend to use `broom::augment()` and `broom::tidy()` instead
11+
(@teunbrand, #3816).
12+
* Custom and raster annotation now respond to scale transformations, and can
13+
use AsIs variables for relative placement (@teunbrand based on
14+
@yutannihilation's prior work, #3120)
15+
* When discrete breaks have names, they'll be used as labels by default
16+
(@teunbrand, #6147).
17+
* The helper function `is.waiver()` is now exported to help extensions to work
18+
with `waiver()` objects (@arcresu, #6173).
19+
* Date(time) scales now throw appropriate errors when `date_breaks`,
20+
`date_minor_breaks` or `date_labels` are not strings (@RodDalBen, #5880)
21+
* `geom_errorbarh()` is deprecated in favour of
22+
`geom_errorbar(orientation = "y")` (@teunbrand, #5961).
23+
* `geom_contour()` should be able to recognise a rotated grid of points
24+
(@teunbrand, #4320)
25+
* `geom_boxplot()` gains additional arguments to style the colour, linetype and
26+
linewidths of the box, whiskers, median line and staples (@teunbrand, #5126)
27+
* (internal) Using `after_scale()` in the `Geom*$default_aes()` field is now
28+
evaluated in the context of data (@teunbrand, #6135)
29+
* Fixed bug where binned scales wouldn't simultaneously accept transformations
30+
and function-limits (@teunbrand, #6144).
31+
* Fixed bug where the `ggplot2::`-prefix did not work with `stage()`
32+
(@teunbrand, #6104).
33+
* New `get_labs()` function for retrieving completed plot labels
34+
(@teunbrand, #6008).
35+
* Built-in `theme_*()` functions now have `ink` and `paper` arguments to control
36+
foreground and background colours respectively (@teunbrand)
37+
* The `summary()` method for ggplots is now more terse about facets
38+
(@teunbrand, #5989).
539
* `guide_bins()`, `guide_colourbar()` and `guide_coloursteps()` gain an `angle`
640
argument to overrule theme settings, similar to `guide_axis(angle)`
741
(@teunbrand, #4594).
@@ -178,6 +212,14 @@
178212
* The ellipsis argument is now checked in `fortify()`, `get_alt_text()`,
179213
`labs()` and several guides (@teunbrand, #3196).
180214
* `stat_summary_bin()` no longer ignores `width` parameter (@teunbrand, #4647).
215+
* Added `keep.zeroes` argument to `stat_bin()` (@teunbrand, #3449)
216+
* `coord_sf()` no longer errors when dealing with empty graticules (@teunbrand, #6052)
217+
* Added `theme_transparent()` with transparent backgrounds (@topepo).
218+
* New theme elements `palette.{aes}.discrete` and `palette.{aes}.continuous`.
219+
Theme palettes replace palettes in scales where `palette = NULL`, which is
220+
the new default in many scales (@teunbrand, #4696).
221+
* `guide_axis()` no longer reserves space for blank ticks
222+
(@teunbrand, #4722, #6069).
181223

182224
# ggplot2 3.5.1
183225

@@ -224,6 +266,7 @@ documentation updates.
224266
* `annotate()` now warns about `stat` or `position` arguments (@teunbrand, #5151)
225267
* `guide_coloursteps(even.steps = FALSE)` now works with discrete data that has
226268
been formatted by `cut()` (@teunbrand, #3877).
269+
* `ggsave()` now offers to install svglite if needed (@eliocamp, #6166).
227270

228271
# ggplot2 3.5.0
229272

R/aes-evaluation.R

Lines changed: 53 additions & 11 deletions
Original file line numberDiff line numberDiff line change
@@ -32,7 +32,7 @@
3232
#' Below follows an overview of the three stages of evaluation and how aesthetic
3333
#' evaluation can be controlled.
3434
#'
35-
#' ## Stage 1: direct input
35+
#' ## Stage 1: direct input at the start
3636
#' The default is to map at the beginning, using the layer data provided by
3737
#' the user. If you want to map directly from the layer data you should not do
3838
#' anything special. This is the only stage where the original layer data can
@@ -87,17 +87,19 @@
8787
#' ```
8888
#'
8989
#' ## Complex staging
90-
#' If you want to map the same aesthetic multiple times, e.g. map `x` to a
91-
#' data column for the stat, but remap it for the geom, you can use the
92-
#' `stage()` function to collect multiple mappings.
90+
#' Sometimes, you may want to map the same aesthetic multiple times, e.g. map
91+
#' `x` to a data column at the start for the layer stat, but remap it later to
92+
#' a variable from the stat transformation for the layer geom. The `stage()`
93+
#' function allows you to control multiple mappings for the same aesthetic
94+
#' across all three stages of evaluation.
9395
#'
9496
#' ```r
9597
#' # Use stage to modify the scaled fill
9698
#' ggplot(mpg, aes(class, hwy)) +
9799
#' geom_boxplot(aes(fill = stage(class, after_scale = alpha(fill, 0.4))))
98100
#'
99101
#' # Using data for computing summary, but placing label elsewhere.
100-
#' # Also, we're making our own computed variable to use for the label.
102+
#' # Also, we're making our own computed variables to use for the label.
101103
#' ggplot(mpg, aes(class, displ)) +
102104
#' geom_violin() +
103105
#' stat_summary(
@@ -110,6 +112,11 @@
110112
#' )
111113
#' ```
112114
#'
115+
#' Conceptually, `aes(x)` is equivalent to `aes(stage(start = x))`, and
116+
#' `aes(after_stat(count))` is equivalent to `aes(stage(after_stat = count))`,
117+
#' and so on. `stage()` is most useful when at least two of its arguments are
118+
#' specified.
119+
#'
113120
#' ## Theme access
114121
#' The `from_theme()` function can be used to acces the [`element_geom()`]
115122
#' fields of the `theme(geom)` argument. Using `aes(colour = from_theme(ink))`
@@ -219,12 +226,10 @@ stage_scaled <- function(start = NULL, after_stat = NULL, after_scale = NULL) {
219226
}
220227

221228
# Regex to determine if an identifier refers to a calculated aesthetic
229+
# The pattern includes ye olde '...var...' syntax, which was
230+
# deprecated in 3.4.0 in favour of `after_stat()`
222231
match_calculated_aes <- "^\\.\\.([a-zA-Z._]+)\\.\\.$"
223232

224-
is_dotted_var <- function(x) {
225-
grepl(match_calculated_aes, x)
226-
}
227-
228233
# Determine if aesthetic is calculated
229234
is_calculated_aes <- function(aesthetics, warn = FALSE) {
230235
vapply(aesthetics, is_calculated, warn = warn, logical(1), USE.NAMES = FALSE)
@@ -246,7 +251,8 @@ is_calculated <- function(x, warn = FALSE) {
246251
if (is.null(x) || is.atomic(x)) {
247252
FALSE
248253
} else if (is.symbol(x)) {
249-
res <- is_dotted_var(as.character(x))
254+
# Test if x is a dotted variable
255+
res <- grepl(match_calculated_aes, as.character(x))
250256
if (res && warn) {
251257
what <- I(paste0("The dot-dot notation (`", x, "`)"))
252258
var <- gsub(match_calculated_aes, "\\1", as.character(x))
@@ -333,7 +339,7 @@ strip_stage <- function(expr) {
333339
} else if (is_call(uq_expr, "stage")) {
334340
uq_expr <- call_match(uq_expr, stage)
335341
# Prefer stat mapping if present, otherwise original mapping (fallback to
336-
# scale mapping) but there should always be two arguments to stage()
342+
# scale mapping)
337343
uq_expr$after_stat %||% uq_expr$start %||% uq_expr$after_scale
338344
} else {
339345
expr
@@ -359,3 +365,39 @@ make_labels <- function(mapping) {
359365
}
360366
Map(default_label, names(mapping), mapping)
361367
}
368+
369+
eval_aesthetics <- function(aesthetics, data, mask = NULL) {
370+
371+
env <- child_env(base_env())
372+
373+
# Here we mask functions, often to replace `stage()` with context appropriate
374+
# functions `stage_calculated()`/`stage_scaled()`.
375+
if (length(mask) > 0) {
376+
aesthetics <- substitute_aes(aesthetics, mask_function, mask = mask)
377+
}
378+
379+
evaled <- lapply(aesthetics, eval_tidy, data = data, env = env)
380+
names(evaled) <- names(aesthetics)
381+
compact(rename_aes(evaled))
382+
}
383+
384+
# `mask` is a list of functions where `names(mask)` indicate names of functions
385+
# that need to be replaced, and `mask[[i]]` is the function to replace it
386+
# with.
387+
mask_function <- function(x, mask) {
388+
if (!is.call(x)) {
389+
return(x)
390+
}
391+
nms <- names(mask)
392+
x[-1] <- lapply(x[-1], mask_function, mask = mask)
393+
if (!is_call(x, nms)) {
394+
return(x)
395+
}
396+
for (nm in nms) {
397+
if (is_call(x, nm)) {
398+
x[[1]] <- mask[[nm]]
399+
return(x)
400+
}
401+
}
402+
}
403+

0 commit comments

Comments
 (0)