Skip to content

Commit 0cdde1d

Browse files
CateGitaupaleolimbot
authored andcommitted
fix documentation for position_dodge and position scales (#3418, fixes 2767)
* added link to sec_axis() in sec.axis parameter documentation and removed it from see also section * added documentation on position_dodge2
1 parent 7b09de3 commit 0cdde1d

File tree

5 files changed

+7
-8
lines changed

5 files changed

+7
-8
lines changed

R/position-dodge.r

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -3,7 +3,8 @@
33
#' Dodging preserves the vertical position of an geom while adjusting the
44
#' horizontal position. `position_dodge2` is a special case of `position_dodge`
55
#' for arranging box plots, which can have variable widths. `position_dodge2`
6-
#' also works with bars and rectangles.
6+
#' also works with bars and rectangles. But unlike `position_dodge`,
7+
#' `position_dodge2` works without a grouping variable in a layer.
78
#'
89
#' @inheritParams position_identity
910
#' @param width Dodging width, when different to the width of the individual

R/scale-continuous.r

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -70,9 +70,8 @@ NULL
7070

7171
#' @rdname scale_continuous
7272
#'
73-
#' @param sec.axis specify a secondary axis
73+
#' @param sec.axis [sec_axis()] is used to specify a secondary axis.
7474
#'
75-
#' @seealso [sec_axis()] for how to specify secondary axes
7675
#' @export
7776
scale_x_continuous <- function(name = waiver(), breaks = waiver(),
7877
minor_breaks = waiver(), labels = waiver(),

man/position_dodge.Rd

Lines changed: 2 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_continuous.Rd

Lines changed: 1 addition & 3 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/scale_date.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)