Skip to content

Commit 4f9b9b4

Browse files
authored
Improve documentation of important ggproto classes (#6426)
* standalone docs for `?Geom` * redirect Geom class docs to `?Geom` * standalone docs for `?Stat` * Redirect Stat class docs to `?Stat` * standalone docs for `?Position` * Redirect Position class docs to `?Position` * polish * document the Layer class * standalone docs for `?Guide` * Redirect `Guide` class docs to `?Guide` * rename `Coord$transform(range)` to `Coord$transform(panel_params)` * standalone docs for `?Coord` * Redirect `Coord` class docs to `?Coord` * structure scale-.R with section titles * move helpers to helper section * standalone docs for `?Scale` * redirect `Scale` class docs to `?Scale` * standalone docs for `?Facet` * redirect `Facet` docs to `?Facet` * Various polishes * standalone docs for `?Layout` * minor polishes * crosslink docs * sprinkle some keywords internal around * fix missing `%||%` on old R versions * fix missing internal keyword * stop this self-inflicted buffoonery * document new method * incorporate community feedback
1 parent 7cc5c72 commit 4f9b9b4

File tree

121 files changed

+7922
-1535
lines changed

Some content is hidden

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

121 files changed

+7922
-1535
lines changed

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: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -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)