Skip to content

Commit e5d10c1

Browse files
committed
crosslink docs
1 parent 4252a67 commit e5d10c1

File tree

3 files changed

+5
-2
lines changed

3 files changed

+5
-2
lines changed

R/autolayer.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -8,7 +8,7 @@
88
#' @param ... other arguments passed to specific methods
99
#' @return a ggplot layer
1010
#' @export
11-
#' @seealso [autoplot()], [ggplot()] and [fortify()]
11+
#' @family plotting automation topics
1212
autolayer <- function(object, ...) {
1313
UseMethod("autolayer")
1414
}

R/autoplot.R

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -105,6 +105,8 @@
105105
#' plot(my_data)
106106
#' ```
107107
#'
108+
#' @family plotting automation topics
109+
#'
108110
#' @name automatic_plotting
109111
NULL
110112

@@ -118,7 +120,7 @@ NULL
118120
#' @param ... other arguments passed to specific methods
119121
#' @return a ggplot object
120122
#' @export
121-
#' @seealso [autolayer()], [ggplot()] and [fortify()]
123+
#' @family plotting automation topics
122124
autoplot <- function(object, ...) {
123125
UseMethod("autoplot")
124126
}

R/fortify.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -4,6 +4,7 @@
44
#' package, which implements a much wider range of methods. `fortify()`
55
#' may be deprecated in the future.
66
#'
7+
#' @family plotting automation topics
78
#' @seealso [fortify.lm()]
89
#' @param model model or other R object to convert to data frame
910
#' @param data original dataset, if needed

0 commit comments

Comments
 (0)