Skip to content
Merged
Show file tree
Hide file tree
Changes from all commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
2 changes: 1 addition & 1 deletion R/fortify-map.r
Original file line number Diff line number Diff line change
Expand Up @@ -86,7 +86,7 @@ map_data <- function(map, region = ".", exact = FALSE, ...) {
#' @param colour border colour
#' @param xlim,ylim latitudinal and logitudinal range for extracting map
#' polygons, see [maps::map()] for details.
#' @param ... other arguments passed onto [geom_polygon()]
#' @inheritDotParams geom_polygon
#' @export
#' @examples
#' if (require("maps")) {
Expand Down
2 changes: 1 addition & 1 deletion R/ggproto.r
Original file line number Diff line number Diff line change
Expand Up @@ -193,7 +193,7 @@ make_proto_method <- function(self, f) {
#' @param x A ggproto object to convert to a list.
#' @param inherit If `TRUE` (the default), flatten all inherited items into
#' the returned list. If `FALSE`, do not include any inherited items.
#' @param ... Further arguments to pass to `as.list.environment`.
#' @inheritDotParams base::as.list.environment -x
#' @export
#' @keywords internal
as.list.ggproto <- function(x, inherit = TRUE, ...) {
Expand Down
4 changes: 1 addition & 3 deletions R/scale-discrete-.r
Original file line number Diff line number Diff line change
Expand Up @@ -6,9 +6,7 @@
#' level, and increasing by one for each level (i.e. the labels are placed
#' at integer positions). This is what allows jittering to work.
#'
#' @param ... common discrete scale parameters: `name`, `breaks`,
#' `labels`, `na.value`, `limits` and `guide`. See
#' [discrete_scale()] for more details
#' @inheritDotParams discrete_scale -expand -position
#' @param expand a numeric vector of length two giving multiplicative and
#' additive expansion constants. These constants ensure that the data is
#' placed some distance away from the axes.
Expand Down
3 changes: 1 addition & 2 deletions R/scale-gradient.r
Original file line number Diff line number Diff line change
Expand Up @@ -15,8 +15,7 @@
#' @param low,high Colours for low and high ends of the gradient.
#' @param guide Type of legend. Use `"colourbar"` for continuous
#' colour bar, or `"legend"` for discrete colour legend.
#' @param ... Other arguments passed on to [continuous_scale()]
#' to control name, limits, breaks, labels and so forth.
#' @inheritDotParams continuous_scale -na.value -guide
#' @seealso [scales::seq_gradient_pal()] for details on underlying
#' palette
#' @family colour scales
Expand Down
1 change: 1 addition & 0 deletions R/scale-grey.r
Original file line number Diff line number Diff line change
Expand Up @@ -5,6 +5,7 @@
#'
#' @inheritParams scales::grey_pal
#' @inheritParams scale_colour_hue
#' @inheritDotParams discrete_scale
#' @family colour scales
#' @rdname scale_grey
#' @export
Expand Down
3 changes: 1 addition & 2 deletions R/scale-hue.r
Original file line number Diff line number Diff line change
Expand Up @@ -5,8 +5,7 @@
#' colour-blind safe palettes.
#'
#' @param na.value Colour to use for missing values
#' @param ... Other arguments passed on to [discrete_scale()]
#' to control name, limits, breaks, labels and so forth.
#' @inheritDotParams discrete_scale
#' @inheritParams scales::hue_pal
#' @rdname scale_hue
#' @export
Expand Down
1 change: 1 addition & 0 deletions R/scale-linetype.r
Original file line number Diff line number Diff line change
Expand Up @@ -5,6 +5,7 @@
#' line types.
#'
#' @inheritParams scale_x_discrete
#' @inheritDotParams discrete_scale -expand -position -na.value
#' @param na.value The linetype to use for `NA` values.
#' @rdname scale_linetype
#' @export
Expand Down
1 change: 1 addition & 0 deletions R/scale-manual.r
Original file line number Diff line number Diff line change
Expand Up @@ -4,6 +4,7 @@
#' data to aesthetic values.
#'
#' @inheritParams scale_x_discrete
#' @inheritDotParams discrete_scale -expand -position
#' @param values a set of aesthetic values to map data values to. If this
#' is a named vector, then the values will be matched based on the names.
#' If unnamed, values will be matched in order (usually alphabetical) with
Expand Down
1 change: 1 addition & 0 deletions R/scale-shape.r
Original file line number Diff line number Diff line change
Expand Up @@ -9,6 +9,7 @@
#' @param solid Should the shapes be solid, `TRUE`, or hollow,
#' `FALSE`?
#' @inheritParams scale_x_discrete
#' @inheritDotParams discrete_scale -expand -position
#' @rdname scale_shape
#' @export
#' @examples
Expand Down
3 changes: 1 addition & 2 deletions R/scale-size.r
Original file line number Diff line number Diff line change
Expand Up @@ -67,8 +67,7 @@ scale_size_discrete <- function(..., range = c(2, 6)) {
}, ...)
}

#' @param ... Other arguments passed on to [continuous_scale()]
#' to control name, limits, breaks, labels and so forth.
#' @inheritDotParams continuous_scale -aesthetics -scale_name -palette -rescaler
#' @param max_size Size of largest points.
#' @export
#' @rdname scale_size
Expand Down
2 changes: 1 addition & 1 deletion R/utilities-break.r
Original file line number Diff line number Diff line change
Expand Up @@ -9,7 +9,7 @@
#' @param x numeric vector
#' @param n number of intervals to create, OR
#' @param length length of each interval
#' @param ... other arguments passed on to [cut()]
#' @inheritDotParams base::cut.default -x
#' @export
#' @examples
#' table(cut_interval(1:100, 10))
Expand Down
9 changes: 8 additions & 1 deletion man/as.list.ggproto.Rd

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

34 changes: 33 additions & 1 deletion man/borders.Rd

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

19 changes: 18 additions & 1 deletion man/cut_interval.Rd

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

2 changes: 1 addition & 1 deletion man/geom_histogram.Rd

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

46 changes: 43 additions & 3 deletions man/scale_discrete.Rd

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

64 changes: 62 additions & 2 deletions man/scale_gradient.Rd

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

52 changes: 50 additions & 2 deletions man/scale_grey.Rd

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

Loading