Skip to content

Commit 08b0f2a

Browse files
committed
Redirect Position class docs to ?Position
1 parent c6b6a39 commit 08b0f2a

9 files changed

+20
-20
lines changed

R/position-dodge.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -97,7 +97,7 @@ position_dodge <- function(width = NULL, preserve = "total", orientation = "x",
9797
)
9898
}
9999

100-
#' @rdname ggplot2-ggproto
100+
#' @rdname Position
101101
#' @format NULL
102102
#' @usage NULL
103103
#' @export

R/position-dodge2.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -12,7 +12,7 @@ position_dodge2 <- function(width = NULL, preserve = "total",
1212
)
1313
}
1414

15-
#' @rdname ggplot2-ggproto
15+
#' @rdname Position
1616
#' @format NULL
1717
#' @usage NULL
1818
#' @export

R/position-identity.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -6,7 +6,7 @@ position_identity <- function() {
66
PositionIdentity
77
}
88

9-
#' @rdname ggplot2-ggproto
9+
#' @rdname Position
1010
#' @format NULL
1111
#' @usage NULL
1212
#' @export

R/position-jitter.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -53,7 +53,7 @@ position_jitter <- function(width = NULL, height = NULL, seed = NA) {
5353
)
5454
}
5555

56-
#' @rdname ggplot2-ggproto
56+
#' @rdname Position
5757
#' @format NULL
5858
#' @usage NULL
5959
#' @export

R/position-jitterdodge.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -36,7 +36,7 @@ position_jitterdodge <- function(jitter.width = NULL, jitter.height = 0,
3636
)
3737
}
3838

39-
#' @rdname ggplot2-ggproto
39+
#' @rdname Position
4040
#' @format NULL
4141
#' @usage NULL
4242
#' @export

R/position-nudge.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -39,7 +39,7 @@ position_nudge <- function(x = NULL, y = NULL) {
3939
)
4040
}
4141

42-
#' @rdname ggplot2-ggproto
42+
#' @rdname Position
4343
#' @format NULL
4444
#' @usage NULL
4545
#' @export

R/position-stack.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -140,7 +140,7 @@ position_fill <- function(vjust = 1, reverse = FALSE) {
140140
ggproto(NULL, PositionFill, vjust = vjust, reverse = reverse)
141141
}
142142

143-
#' @rdname ggplot2-ggproto
143+
#' @rdname Position
144144
#' @format NULL
145145
#' @usage NULL
146146
#' @export
@@ -244,7 +244,7 @@ pos_stack <- function(df, width, vjust = 1, fill = FALSE) {
244244
}
245245

246246

247-
#' @rdname ggplot2-ggproto
247+
#' @rdname Position
248248
#' @format NULL
249249
#' @usage NULL
250250
#' @export

man/Position.Rd

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

man/ggplot2-ggproto.Rd

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

0 commit comments

Comments
 (0)