Skip to content

Commit b36bba8

Browse files
authored
Add more parens (#4061)
* Add more parens * Document * Un-paren
1 parent 2edcec1 commit b36bba8

Some content is hidden

Large Commits have some content hidden by default. Use the searchbox below for content that may be hidden.

65 files changed

+122
-122
lines changed

R/aes.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -214,7 +214,7 @@ is_position_aes <- function(vars) {
214214
#'
215215
#' Aesthetic mappings describe how variables in the data are mapped to visual
216216
#' properties (aesthetics) of geoms. [aes()] uses non-standard
217-
#' evaluation to capture the variable names. `aes_` and `aes_string`
217+
#' evaluation to capture the variable names. `aes_()` and `aes_string()`
218218
#' require you to explicitly quote the inputs either with `""` for
219219
#' `aes_string()`, or with `quote` or `~` for `aes_()`.
220220
#' (`aes_q()` is an alias to `aes_()`). This makes `aes_()` and

R/annotation-custom.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -17,7 +17,7 @@ NULL
1717
#' @param ymin,ymax y location (in data coordinates) giving vertical
1818
#' location of raster
1919
#' @export
20-
#' @note `annotation_custom` expects the grob to fill the entire viewport
20+
#' @note `annotation_custom()` expects the grob to fill the entire viewport
2121
#' defined by xmin, xmax, ymin, ymax. Grobs with a different (absolute) size
2222
#' will be center-justified in that region.
2323
#' Inf values can be used to fill the full plot panel (see examples).

R/annotation-logticks.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -18,7 +18,7 @@
1818
#' long tick marks. In base 10, these are the "1" (or "10") ticks.
1919
#' @param scaled is the data already log-scaled? This should be `TRUE`
2020
#' (default) when the data is already transformed with `log10()` or when
21-
#' using `scale_y_log10`. It should be `FALSE` when using
21+
#' using `scale_y_log10()`. It should be `FALSE` when using
2222
#' `coord_trans(y = "log10")`.
2323
#' @param colour Colour of the tick marks.
2424
#' @param size Thickness of tick marks, in mm.

R/coord-.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
#' @section Coordinate systems:
22
#'
3-
#' All `coord_*` functions (like `coord_trans`) return a `Coord*`
3+
#' All `coord_*()` functions (like `coord_trans()`) return a `Coord*`
44
#' object (like `CoordTrans`).
55
#'
66
#' Each of the `Coord*` objects is a [ggproto()] object,

R/coord-map.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -3,7 +3,7 @@
33
#' `coord_map()` projects a portion of the earth, which is approximately
44
#' spherical, onto a flat 2D plane using any projection defined by the
55
#' `mapproj` package. Map projections do not, in general, preserve straight
6-
#' lines, so this requires considerable computation. `coord_quickmap` is a
6+
#' lines, so this requires considerable computation. `coord_quickmap()` is a
77
#' quick approximation that does preserve straight lines. It works best for
88
#' smaller areas closer to the equator.
99
#'

R/facet-.r

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -31,7 +31,7 @@ NULL
3131
#' turn and is expected to supply a `PANEL` column mapping each row to a
3232
#' panel defined in the layout. Additionally this method can also add or
3333
#' subtract data points as needed e.g. in the case of adding margins to
34-
#' `facet_grid`.
34+
#' `facet_grid()`.
3535
#'
3636
#' - `draw_panels`: This is where the panels are assembled into a
3737
#' `gtable` object. The method receives, among others, a list of grobs
@@ -494,8 +494,8 @@ max_width <- function(grobs, value_only = FALSE) {
494494
#' Find panels in a gtable
495495
#'
496496
#' These functions help detect the placement of panels in a gtable, if they are
497-
#' named with "panel" in the beginning. `find_panel` returns the extend of
498-
#' the panel area, while `panel_cols` and `panel_rows` returns the
497+
#' named with "panel" in the beginning. `find_panel()` returns the extend of
498+
#' the panel area, while `panel_cols()` and `panel_rows()` returns the
499499
#' columns and rows that contains panels respectively.
500500
#'
501501
#' @param table A gtable

R/facet-wrap.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -393,7 +393,7 @@ FacetWrap <- ggproto("FacetWrap", Facet,
393393
#'
394394
#' Cleans up the input to be an integer greater than or equal to one, or
395395
#' `NULL`. Intended to be used on the `nrow` and `ncol`
396-
#' arguments of `facet_wrap`.
396+
#' arguments of `facet_wrap()`.
397397
#' @param n Hopefully an integer greater than or equal to one, or `NULL`,
398398
#' though other inputs are handled.
399399
#' @return An integer greater than or equal to one, or `NULL`.

R/fortify.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,7 @@
11
#' Fortify a model with data.
22
#'
33
#' Rather than using this function, I now recommend using the \pkg{broom}
4-
#' package, which implements a much wider range of methods. `fortify`
4+
#' package, which implements a much wider range of methods. `fortify()`
55
#' may be deprecated in the future.
66
#'
77
#' @seealso [fortify.lm()]

R/geom-.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -3,7 +3,7 @@ NULL
33

44
#' @section Geoms:
55
#'
6-
#' All `geom_*` functions (like `geom_point`) return a layer that
6+
#' All `geom_*()` functions (like `geom_point()`) return a layer that
77
#' contains a `Geom*` object (like `GeomPoint`). The `Geom*`
88
#' object is responsible for rendering the data in the plot.
99
#'

R/geom-bin2d.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -11,7 +11,7 @@
1111
#' @inheritParams layer
1212
#' @inheritParams geom_point
1313
#' @param geom,stat Use to override the default connection between
14-
#' `geom_bin2d` and `stat_bin2d`.
14+
#' `geom_bin2d()` and `stat_bin2d()`.
1515
#' @seealso [stat_binhex()] for hexagonal binning
1616
#' @examples
1717
#' d <- ggplot(diamonds, aes(x, y)) + xlim(4, 10) + ylim(4, 10)

0 commit comments

Comments
 (0)