Skip to content

Commit 4b7a189

Browse files
committed
fix doc links
1 parent 18b9273 commit 4b7a189

File tree

6 files changed

+6
-6
lines changed

6 files changed

+6
-6
lines changed

R/plot-construction.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -96,7 +96,7 @@ add_ggplot <- function(p, object, objectname) {
9696
#' Add custom objects to ggplot
9797
#'
9898
#' This generic allows you to add your own methods for adding custom objects to
99-
#' a ggplot with [+.gg].
99+
#' a ggplot with [+.gg][add_gg].
100100
#'
101101
#' @param object An object to add to the plot
102102
#' @param plot The ggplot object to add `object` to

R/theme-current.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -40,7 +40,7 @@ NULL
4040
#' @return `set_theme()`, `update_theme()`, and `replace_theme()`
4141
#' invisibly return the previous theme so you can easily save it, then
4242
#' later restore it.
43-
#' @seealso [+.gg()]
43+
#' @seealso [add_gg()]
4444
#' @export
4545
#' @examples
4646
#' p <- ggplot(mtcars, aes(mpg, wt)) +

R/theme.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -217,7 +217,7 @@
217217
#' @param validate `TRUE` to run `check_element()`, `FALSE` to bypass checks.
218218
#' @export
219219
#' @seealso
220-
#' [+.gg()] and [%+replace%],
220+
#' [add_gg()] and [%+replace%],
221221
#' [element_blank()], [element_line()],
222222
#' [element_rect()], and [element_text()] for
223223
#' details of the specific theme elements.

man/get_theme.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/ggplot_add.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/theme.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)