Skip to content

Commit 1112582

Browse files
authored
Add parentheses (#4059)
1 parent 01df437 commit 1112582

Some content is hidden

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

44 files changed

+76
-76
lines changed

R/aes.r

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -217,10 +217,10 @@ is_position_aes <- function(vars) {
217217
#' 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_()`.
220-
#' (`aes_q` is an alias to `aes_`). This makes `aes_` and
221-
#' `aes_string` easy to program with.
220+
#' (`aes_q()` is an alias to `aes_()`). This makes `aes_()` and
221+
#' `aes_string()` easy to program with.
222222
#'
223-
#' `aes_string` and `aes_` are particularly useful when writing
223+
#' `aes_string()` and `aes_()` are particularly useful when writing
224224
#' functions that create plots because you can use strings or quoted
225225
#' names/calls to define the aesthetic mappings, rather than having to use
226226
#' [substitute()] to generate a call to `aes()`.

R/autolayer.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
#' Create a ggplot layer appropriate to a particular data type
22
#'
3-
#' `autolayer` uses ggplot2 to draw a particular layer for an object of a
3+
#' `autolayer()` uses ggplot2 to draw a particular layer for an object of a
44
#' particular class in a single command. This defines the S3 generic that
55
#' other classes and packages can extend.
66
#'

R/autoplot.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
#' Create a complete ggplot appropriate to a particular data type
22
#'
3-
#' `autoplot` uses ggplot2 to draw a particular plot for an object of a
3+
#' `autoplot()` uses ggplot2 to draw a particular plot for an object of a
44
#' particular class in a single command. This defines the S3 generic that
55
#' other classes and packages can extend.
66
#'

R/axis-secondary.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -24,12 +24,12 @@
2424
#' the axis on the plot. Usually this is [guide_axis()].
2525
#'
2626
#' @details
27-
#' `sec_axis` is used to create the specifications for a secondary axis.
27+
#' `sec_axis()` is used to create the specifications for a secondary axis.
2828
#' Except for the `trans` argument any of the arguments can be set to
2929
#' `derive()` which would result in the secondary axis inheriting the
3030
#' settings from the primary axis.
3131
#'
32-
#' `dup_axis` is provide as a shorthand for creating a secondary axis that
32+
#' `dup_axis()` is provide as a shorthand for creating a secondary axis that
3333
#' is a duplication of the primary axis, effectively mirroring the primary axis.
3434
#'
3535
#' As of v3.1, date and datetime scales have limited secondary axis capabilities.

R/coord-map.r

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
#' Map projections
22
#'
3-
#' `coord_map` projects a portion of the earth, which is approximately
3+
#' `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
66
#' lines, so this requires considerable computation. `coord_quickmap` is a
@@ -15,7 +15,7 @@
1515
#' 0. For regions that span only a few degrees and are not too close to the
1616
#' poles, setting the aspect ratio of the plot to the appropriate lat/lon ratio
1717
#' approximates the usual mercator projection. This is what
18-
#' `coord_quickmap` does, and is much faster (particularly for complex
18+
#' `coord_quickmap()` does, and is much faster (particularly for complex
1919
#' plots like [geom_tile()]) at the expense of correctness.
2020
#'
2121
#' @param projection projection to use, see

R/coord-transform.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
#' Transformed Cartesian coordinate system
22
#'
3-
#' `coord_trans` is different to scale transformations in that it occurs after
3+
#' `coord_trans()` is different to scale transformations in that it occurs after
44
#' statistical transformation and will affect the visual appearance of geoms - there is
55
#' no guarantee that straight lines will continue to be straight.
66
#'

R/facet-wrap.r

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

44
#' Wrap a 1d ribbon of panels into 2d
55
#'
6-
#' `facet_wrap` wraps a 1d sequence of panels into 2d. This is generally
6+
#' `facet_wrap()` wraps a 1d sequence of panels into 2d. This is generally
77
#' a better use of screen space than [facet_grid()] because most
88
#' displays are roughly rectangular.
99
#'

R/geom-.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -14,7 +14,7 @@ NULL
1414
#' Compared to `Stat` and `Position`, `Geom` is a little
1515
#' different because the execution of the setup and compute functions is
1616
#' split up. `setup_data` runs before position adjustments, and
17-
#' `draw_layer` is not run until render time, much later. This
17+
#' `draw_layer()` is not run until render time, much later. This
1818
#' means there is no `setup_params` because it's hard to communicate
1919
#' the changes.
2020
#'

R/geom-ribbon.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -2,7 +2,7 @@
22
#'
33
#' For each x value, `geom_ribbon()` displays a y interval defined
44
#' by `ymin` and `ymax`. `geom_area()` is a special case of
5-
#' `geom_ribbon`, where the `ymin` is fixed to 0 and `y` is used instead
5+
#' `geom_ribbon()`, where the `ymin` is fixed to 0 and `y` is used instead
66
#' of `ymax`.
77
#'
88
#' An area plot is the continuous analogue of a stacked bar chart (see

R/geom-segment.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
#' Line segments and curves
22
#'
3-
#' `geom_segment` draws a straight line between points (x, y) and
3+
#' `geom_segment()` draws a straight line between points (x, y) and
44
#' (xend, yend). `geom_curve` draws a curved line. See the underlying
55
#' drawing function [grid::curveGrob()] for the parameters that
66
#' control the curve.

0 commit comments

Comments
 (0)