Skip to content

Commit 0e7c028

Browse files
committed
Fix feedback from CRAN
1 parent 8b27990 commit 0e7c028

File tree

4 files changed

+8
-8
lines changed

4 files changed

+8
-8
lines changed

R/facet-.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -9,8 +9,8 @@ NULL
99
#' rendered.
1010
#'
1111
#' Extending facets can range from the simple modifications of current facets,
12-
#' to very laborious rewrites with a lot of [gtable()] manipulation.
13-
#' For some examples of both, please see the extension vignette.
12+
#' to very laborious rewrites with a lot of [`gtable()`][gtable::gtable()]
13+
#' manipulation. For some examples of both, please see the extension vignette.
1414
#'
1515
#' `Facet` subclasses, like other extendible ggproto classes, have a range
1616
#' of methods that can be modified. Some of these are required for all new

R/plot-build.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -160,7 +160,7 @@ layer_grob <- function(plot = last_plot(), i = 1L) {
160160
#' Build a plot with all the usual bits and pieces.
161161
#'
162162
#' This function builds all grobs necessary for displaying the plot, and
163-
#' stores them in a special data structure called a [gtable()].
163+
#' stores them in a special data structure called a [`gtable`][gtable::gtable].
164164
#' This object is amenable to programmatic manipulation, should you want
165165
#' to (e.g.) make the legend box 2 cm wide, or combine multiple plots into
166166
#' a single display, preserving aspect ratios across the plots.
@@ -171,7 +171,7 @@ layer_grob <- function(plot = last_plot(), i = 1L) {
171171
#' a ggplot2 plot.
172172
#'
173173
#' The `r link_book("gtable step section", "internals#sec-ggplotgtable")`
174-
#' @return a [gtable()] object
174+
#' @return a `gtable` object
175175
#' @keywords internal
176176
#' @param data plot data generated by [ggplot_build()]
177177
#' @export

man/ggplot2-ggproto.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.

man/ggplot_gtable.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)