Skip to content

Commit 5d79442

Browse files
committed
resolve merge conflict
Merge branch 'main' into boilerplates # Conflicts: # R/geom-bar.R # R/geom-bin2d.R # R/geom-col.R # R/geom-contour.R # R/geom-curve.R # R/geom-density.R # R/geom-errorbar.R # R/geom-function.R # R/geom-hex.R # R/geom-linerange.R # R/geom-path.R # R/geom-point.R # R/geom-pointrange.R # R/geom-quantile.R # R/geom-raster.R # R/geom-rect.R # R/geom-ribbon.R # R/geom-rug.R # R/geom-segment.R # R/geom-smooth.R # R/geom-spoke.R # R/geom-text.R # R/geom-tile.R # R/stat-align.R # R/stat-bin.R # R/stat-bin2d.R # R/stat-binhex.R # R/stat-boxplot.R # R/stat-connect.R # R/stat-contour.R # R/stat-count.R # R/stat-density-2d.R # R/stat-density.R # R/stat-ecdf.R # R/stat-ellipse.R # R/stat-function.R # R/stat-identity.R # R/stat-manual.R # R/stat-qq-line.R # R/stat-qq.R # R/stat-quantilemethods.R # R/stat-smooth.R # R/stat-sum.R # R/stat-summary-2d.R # R/stat-summary-hex.R # R/stat-unique.R # R/stat-ydensity.R # man/ggplot2-ggproto.Rd
2 parents 7625aa2 + 4f9b9b4 commit 5d79442

File tree

170 files changed

+8673
-2021
lines changed

Some content is hidden

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

170 files changed

+8673
-2021
lines changed

NAMESPACE

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -170,6 +170,7 @@ export(CoordQuickmap)
170170
export(CoordRadial)
171171
export(CoordSf)
172172
export(CoordTrans)
173+
export(CoordTransform)
173174
export(Facet)
174175
export(FacetGrid)
175176
export(FacetNull)
@@ -324,6 +325,7 @@ export(coord_quickmap)
324325
export(coord_radial)
325326
export(coord_sf)
326327
export(coord_trans)
328+
export(coord_transform)
327329
export(cut_interval)
328330
export(cut_number)
329331
export(cut_width)

NEWS.md

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,8 @@
11
# ggplot2 (development version)
22

3+
* In continuous scales, when `breaks` is a function and `n.breaks` is set, the
4+
`n.breaks` will be passed to the `breaks` function. Previously, `n.breaks`
5+
only applied to the default break calculation (@teunbrand, #5972)
36
* (internal) New `Facet$draw_panel_content()` method for delegating panel
47
assembly (@Yunuuuu, #6406).
58
* Facet gains a new method `setup_panel_params` to interact with the
@@ -280,6 +283,7 @@
280283
(@teunbrand, #5938, #4327).
281284
* Fixed bug where empty discrete scales weren't recognised as such
282285
(@teunbrand, #5945).
286+
* `coord_trans()` renamed to `coord_transform()` (@nmercadeb, #5825).
283287
* (internal) The summary function of `stat_summary()` and `stat_summary_bin()`
284288
is setup once in total instead of once per group (@teunbrand, #5971)
285289
* `facet_grid(space = "free")` can now be combined with `coord_fixed()`

R/annotation-custom.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -58,7 +58,7 @@ annotation_custom <- function(grob, xmin = -Inf, xmax = Inf, ymin = -Inf, ymax =
5858
)
5959
}
6060

61-
#' @rdname ggplot2-ggproto
61+
#' @rdname Geom
6262
#' @format NULL
6363
#' @usage NULL
6464
#' @export

R/annotation-logticks.R

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -24,7 +24,7 @@
2424
#' @param scaled is the data already log-scaled? This should be `TRUE`
2525
#' (default) when the data is already transformed with `log10()` or when
2626
#' using `scale_y_log10()`. It should be `FALSE` when using
27-
#' `coord_trans(y = "log10")`.
27+
#' `coord_transform(y = "log10")`.
2828
#' @param colour Colour of the tick marks.
2929
#' @param linewidth Thickness of tick marks, in mm.
3030
#' @param linetype Linetype of tick marks (`solid`, `dashed`, etc.)
@@ -36,7 +36,7 @@
3636
#' @export
3737
#' @seealso [scale_y_continuous()], [scale_y_log10()] for log scale
3838
#' transformations.
39-
#' @seealso [coord_trans()] for log coordinate transformations.
39+
#' @seealso [coord_transform()] for log coordinate transformations.
4040
#'
4141
#' @examples
4242
#' # Make a log-log plot (without log ticks)
@@ -75,7 +75,7 @@
7575
#' # Using a coordinate transform requires scaled = FALSE
7676
#' t <- ggplot(msleep, aes(bodywt, brainwt)) +
7777
#' geom_point() +
78-
#' coord_trans(x = "log10", y = "log10") +
78+
#' coord_transform(x = "log10", y = "log10") +
7979
#' theme_bw()
8080
#' t + annotation_logticks(scaled = FALSE)
8181
#'
@@ -123,7 +123,7 @@ annotation_logticks <- function(base = 10, sides = "bl", outside = FALSE, scaled
123123
)
124124
}
125125

126-
#' @rdname ggplot2-ggproto
126+
#' @rdname Geom
127127
#' @format NULL
128128
#' @usage NULL
129129
#' @export

R/annotation-map.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -76,7 +76,7 @@ annotation_map <- function(map, ...) {
7676
)
7777
}
7878

79-
#' @rdname ggplot2-ggproto
79+
#' @rdname Geom
8080
#' @format NULL
8181
#' @usage NULL
8282
#' @export

R/annotation-raster.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -61,7 +61,7 @@ annotation_raster <- function(raster, xmin, xmax, ymin, ymax,
6161

6262
}
6363

64-
#' @rdname ggplot2-ggproto
64+
#' @rdname Geom
6565
#' @format NULL
6666
#' @usage NULL
6767
#' @export

0 commit comments

Comments
 (0)