Skip to content

Commit 2b03e47

Browse files
authored
Minor documentation fixes. (tidyverse#4026)
1 parent 323af07 commit 2b03e47

File tree

4 files changed

+4
-5
lines changed

4 files changed

+4
-5
lines changed

R/geom-text.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -43,7 +43,7 @@
4343
#' displayed as described in `?plotmath`.
4444
#' @param nudge_x,nudge_y Horizontal and vertical adjustment to nudge labels by.
4545
#' Useful for offsetting text from points, particularly on discrete scales.
46-
#' Cannot be jointy specified with `position`.
46+
#' Cannot be jointly specified with `position`.
4747
#' @param position Position adjustment, either as a string, or the result of
4848
#' a call to a position adjustment function. Cannot be jointy specified with
4949
#' `nudge_x` or `nudge_y`.

R/scale-hue.r

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -82,7 +82,6 @@ scale_fill_hue <- function(..., h = c(0, 360) + 15, c = 100, l = 65, h.start = 0
8282
#' * A function that returns a discrete colour/fill scale (e.g., [scale_fill_hue()],
8383
#' [scale_fill_brewer()], etc).
8484
#' @export
85-
#' @rdname
8685
#' @examples
8786
#' # Template function for creating densities grouped by a variable
8887
#' cty_by_var <- function(var) {

man/geom_text.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.

man/ggsf.Rd

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

0 commit comments

Comments
 (0)