Skip to content

Commit

Permalink
Export GeomBin2d
Browse files Browse the repository at this point in the history
Fix #5791
  • Loading branch information
lgibson7 committed Aug 15, 2024
1 parent ee5c9e5 commit 88ca648
Show file tree
Hide file tree
Showing 4 changed files with 21 additions and 11 deletions.
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -134,6 +134,7 @@ Collate:
'geom-abline.R'
'geom-rect.R'
'geom-bar.R'
'geom-tile.R'
'geom-bin2d.R'
'geom-blank.R'
'geom-boxplot.R'
Expand Down Expand Up @@ -167,7 +168,6 @@ Collate:
'geom-smooth.R'
'geom-spoke.R'
'geom-text.R'
'geom-tile.R'
'geom-violin.R'
'geom-vline.R'
'ggplot2-package.R'
Expand Down
1 change: 1 addition & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -176,6 +176,7 @@ export(GeomAbline)
export(GeomAnnotationMap)
export(GeomArea)
export(GeomBar)
export(GeomBin2d)
export(GeomBlank)
export(GeomBoxplot)
export(GeomCol)
Expand Down
10 changes: 9 additions & 1 deletion R/geom-bin2d.R
Original file line number Diff line number Diff line change
@@ -1,3 +1,6 @@
#' @include geom-tile.R
NULL

#' Heatmap of 2d bin counts
#'
#' Divides the plane into rectangles, counts the number of cases in
Expand Down Expand Up @@ -37,7 +40,7 @@ geom_bin_2d <- function(mapping = NULL, data = NULL,
data = data,
mapping = mapping,
stat = stat,
geom = GeomTile,
geom = GeomBin2d,
position = position,
show.legend = show.legend,
inherit.aes = inherit.aes,
Expand All @@ -53,3 +56,8 @@ geom_bin_2d <- function(mapping = NULL, data = NULL,
#' @usage NULL
geom_bin2d <- geom_bin_2d

#' @rdname ggplot2-ggproto
#' @format NULL
#' @usage NULL
#' @export
GeomBin2d <- ggproto("GeomBin2d", GeomTile)
19 changes: 10 additions & 9 deletions man/ggplot2-ggproto.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 88ca648

Please sign in to comment.