Skip to content

Commit

Permalink
Fix typos part III (#5313)
Browse files Browse the repository at this point in the history
* Fix typos

* Lingering fix
  • Loading branch information
teunbrand authored Jun 8, 2023
1 parent 14a6b29 commit 98f04aa
Show file tree
Hide file tree
Showing 28 changed files with 32 additions and 32 deletions.
2 changes: 1 addition & 1 deletion R/coord-cartesian-.R
Original file line number Diff line number Diff line change
Expand Up @@ -43,7 +43,7 @@
#' # limits. You can set the limits precisely by setting expand = FALSE
#' p + coord_cartesian(xlim = c(325, 500), expand = FALSE)
#'
#' # Simiarly, we can use expand = FALSE to turn off expansion with the
#' # Similarly, we can use expand = FALSE to turn off expansion with the
#' # default limits
#' p + coord_cartesian(expand = FALSE)
#'
Expand Down
2 changes: 1 addition & 1 deletion R/geom-tile.R
Original file line number Diff line number Diff line change
Expand Up @@ -15,7 +15,7 @@
#'
#' @details
#' `geom_rect()` and `geom_tile()`'s respond differently to scale
#' transformations due to their parametrisation. In `geom_rect()`, the scale
#' transformations due to their parameterisation. In `geom_rect()`, the scale
#' transformation is applied to the corners of the rectangles. In `geom_tile()`,
#' the transformation is applied only to the centres and its size is determined
#' after transformation.
Expand Down
2 changes: 1 addition & 1 deletion R/guide-.R
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
#' Guide constructor
#'
#' A constructor function for guides, which performs some standard compatability
#' A constructor function for guides, which performs some standard compatibility
#' checks between the guide and provided arguments.
#'
#' @param ... Named arguments that match the parameters of `super$params` or
Expand Down
2 changes: 1 addition & 1 deletion R/guide-colorsteps.R
Original file line number Diff line number Diff line change
Expand Up @@ -13,7 +13,7 @@
#' shown irrespective of the value of `show.limits`.
#' @param ticks A theme object for rendering tick marks at the colourbar.
#' Usually, the object of `element_line()` is expected. If `element_blank()`
#' (default), no tick marks are drawn. For backward compatability, can also
#' (default), no tick marks are drawn. For backward compatibility, can also
#' be a logical which translates `TRUE` to `element_line()` and `FALSE` to
#' `element_blank()`.
#' @inheritDotParams guide_colourbar -nbin -raster -ticks -available_aes
Expand Down
2 changes: 1 addition & 1 deletion R/layer.R
Original file line number Diff line number Diff line change
Expand Up @@ -49,7 +49,7 @@
#' @param params Additional parameters to the `geom` and `stat`.
#' @param key_glyph A legend key drawing function or a string providing the
#' function name minus the `draw_key_` prefix. See [draw_key] for details.
#' @param layer_class The type of layer object to be constructued. This is
#' @param layer_class The type of layer object to be constructed. This is
#' intended for ggplot2 internal use only.
#' @keywords internal
#' @examples
Expand Down
2 changes: 1 addition & 1 deletion R/position-dodge.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
#' be specified in the global or `geom_*` layer. Unlike `position_dodge()`,
#' `position_dodge2()` works without a grouping variable in a layer.
#' `position_dodge2()` works with bars and rectangles, but is
#' particulary useful for arranging box plots, which
#' particularly useful for arranging box plots, which
#' can have variable widths.
#'
#' @param width Dodging width, when different to the width of the individual
Expand Down
2 changes: 1 addition & 1 deletion R/scale-.R
Original file line number Diff line number Diff line change
Expand Up @@ -375,7 +375,7 @@ binned_scale <- function(aesthetics, scale_name, palette, name = waiver(),
#' - `dimension()` For continuous scales, the dimension is the same concept as the limits.
#' For discrete scales, `dimension()` returns a continuous range, where the limits
#' would be placed at integer positions. `dimension()` optionally expands
#' this range given an expantion of length 4 (see [expansion()]).
#' this range given an expansion of length 4 (see [expansion()]).
#'
#' - `break_info()` Returns a `list()` with calculated values needed for the `Coord`
#' to transform values in transformed data space. Axis and grid guides also use
Expand Down
2 changes: 1 addition & 1 deletion R/scale-brewer.R
Original file line number Diff line number Diff line change
Expand Up @@ -69,7 +69,7 @@
#' theme_dark()
#' }
#'
#' # Use distiller variant with continous data
#' # Use distiller variant with continuous data
#' v <- ggplot(faithfuld) +
#' geom_tile(aes(waiting, eruptions, fill = density))
#' v
Expand Down
2 changes: 1 addition & 1 deletion R/scale-colour.R
Original file line number Diff line number Diff line change
Expand Up @@ -44,7 +44,7 @@
#' palette) are not suitable to support all viewers, especially those with
#' color vision deficiencies. Using `viridis` type, which is perceptually
#' uniform in both colour and black-and-white display is an easy option to
#' ensure good perceptive properties of your visulizations.
#' ensure good perceptive properties of your visualizations.
#' The colorspace package offers functionalities
#' - to generate color palettes with good perceptive properties,
#' - to analyse a given color palette, like emulating color blindness,
Expand Down
2 changes: 1 addition & 1 deletion R/scale-manual.R
Original file line number Diff line number Diff line change
Expand Up @@ -40,7 +40,7 @@
#' palette) are not suitable to support all viewers, especially those with
#' color vision deficiencies. Using `viridis` type, which is perceptually
#' uniform in both colour and black-and-white display is an easy option to
#' ensure good perceptive properties of your visulizations.
#' ensure good perceptive properties of your visualizations.
#' The colorspace package offers functionalities
#' - to generate color palettes with good perceptive properties,
#' - to analyse a given color palette, like emulating color blindness,
Expand Down
2 changes: 1 addition & 1 deletion R/scale-viridis.R
Original file line number Diff line number Diff line change
Expand Up @@ -49,7 +49,7 @@
#' # the order of colour can be reversed
#' p + scale_fill_viridis_d(direction = -1)
#'
#' # Use viridis_c with continous data
#' # Use viridis_c with continuous data
#' (v <- ggplot(faithfuld) +
#' geom_tile(aes(waiting, eruptions, fill = density)))
#' v + scale_fill_viridis_c()
Expand Down
2 changes: 1 addition & 1 deletion R/stat-contour.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@
#' @eval rd_aesthetics("stat", "contour_filled")
#' @eval rd_computed_vars(
#' .details = "The computed variables differ somewhat for contour lines
#' (compbuted by `stat_contour()`) and contour bands (filled contours,
#' (computed by `stat_contour()`) and contour bands (filled contours,
#' computed by `stat_contour_filled()`). The variables `nlevel` and `piece`
#' are available for both, whereas `level_low`, `level_high`, and `level_mid`
#' are only available for bands. The variable `level` is a numeric or a factor
Expand Down
2 changes: 1 addition & 1 deletion R/stat-sf-coordinates.R
Original file line number Diff line number Diff line change
Expand Up @@ -19,7 +19,7 @@
#' For the first step, you can use an arbitrary function via `fun.geometry`.
#' By default, `function(x) sf::st_point_on_surface(sf::st_zm(x))` is used;
#' `sf::st_point_on_surface()` seems more appropriate than `sf::st_centroid()`
#' since lables and text usually are intended to be put within the polygon or
#' since labels and text usually are intended to be put within the polygon or
#' the line. `sf::st_zm()` is needed to drop Z and M dimension beforehand,
#' otherwise `sf::st_point_on_surface()` may fail when the geometries have M
#' dimension.
Expand Down
6 changes: 3 additions & 3 deletions R/utilities.R
Original file line number Diff line number Diff line change
Expand Up @@ -429,11 +429,11 @@ switch_orientation <- function(aesthetics) {
#' features in the data correspond to:
#'
#' - `main_is_orthogonal`: This argument controls how the existence of only a `x`
#' or `y` aesthetic is understood. If `TRUE` then the exisiting aesthetic
#' or `y` aesthetic is understood. If `TRUE` then the existing aesthetic
#' would be then secondary axis. This behaviour is present in [stat_ydensity()]
#' and [stat_boxplot()]. If `FALSE` then the exisiting aesthetic is the main
#' and [stat_boxplot()]. If `FALSE` then the existing aesthetic is the main
#' axis as seen in e.g. [stat_bin()], [geom_count()], and [stat_density()].
#' - `range_is_orthogonal`: This argument controls whether the existance of
#' - `range_is_orthogonal`: This argument controls whether the existence of
#' range-like aesthetics (e.g. `xmin` and `xmax`) represents the main or
#' secondary axis. If `TRUE` then the range is given for the secondary axis as
#' seen in e.g. [geom_ribbon()] and [geom_linerange()].
Expand Down
6 changes: 3 additions & 3 deletions man/bidirection.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/coord_cartesian.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/geom_contour.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/geom_tile.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/ggplot2-ggproto.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/guide_coloursteps.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/layer.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/new_guide.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/position_dodge.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/scale_brewer.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/scale_colour_continuous.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/scale_manual.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/scale_viridis.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/stat_sf_coordinates.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 98f04aa

Please sign in to comment.