Skip to content

Commit 9b07550

Browse files
authored
Export GeomBin2d (#6048)
Fix #5791
1 parent 083a17d commit 9b07550

File tree

4 files changed

+21
-11
lines changed

4 files changed

+21
-11
lines changed

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -135,6 +135,7 @@ Collate:
135135
'geom-abline.R'
136136
'geom-rect.R'
137137
'geom-bar.R'
138+
'geom-tile.R'
138139
'geom-bin2d.R'
139140
'geom-blank.R'
140141
'geom-boxplot.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'

NAMESPACE

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -172,6 +172,7 @@ export(GeomAbline)
172172
export(GeomAnnotationMap)
173173
export(GeomArea)
174174
export(GeomBar)
175+
export(GeomBin2d)
175176
export(GeomBlank)
176177
export(GeomBoxplot)
177178
export(GeomCol)

R/geom-bin2d.R

Lines changed: 9 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,6 @@
1+
#' @include geom-tile.R
2+
NULL
3+
14
#' Heatmap of 2d bin counts
25
#'
36
#' Divides the plane into rectangles, counts the number of cases in
@@ -37,7 +40,7 @@ geom_bin_2d <- function(mapping = NULL, data = NULL,
3740
data = data,
3841
mapping = mapping,
3942
stat = stat,
40-
geom = GeomTile,
43+
geom = GeomBin2d,
4144
position = position,
4245
show.legend = show.legend,
4346
inherit.aes = inherit.aes,
@@ -53,3 +56,8 @@ geom_bin_2d <- function(mapping = NULL, data = NULL,
5356
#' @usage NULL
5457
geom_bin2d <- geom_bin_2d
5558

59+
#' @rdname ggplot2-ggproto
60+
#' @format NULL
61+
#' @usage NULL
62+
#' @export
63+
GeomBin2d <- ggproto("GeomBin2d", GeomTile)

man/ggplot2-ggproto.Rd

Lines changed: 10 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)