Skip to content

Commit 5c11540

Browse files
authored
typos (#5312)
1 parent b75cee4 commit 5c11540

17 files changed

+23
-23
lines changed

R/autolayer.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -15,5 +15,5 @@ autolayer <- function(object, ...) {
1515

1616
#' @export
1717
autolayer.default <- function(object, ...) {
18-
cli::cli_abort("No autolayer method avialable for {.cls {class(object)[1]}} objects")
18+
cli::cli_abort("No autolayer method available for {.cls {class(object)[1]}} objects")
1919
}

R/axis-secondary.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -96,7 +96,7 @@
9696
#' @export
9797
sec_axis <- function(trans = NULL, name = waiver(), breaks = waiver(), labels = waiver(),
9898
guide = waiver()) {
99-
# sec_axis() historically accpeted two-sided formula, so be permissive.
99+
# sec_axis() historically accepted two-sided formula, so be permissive.
100100
if (length(trans) > 2) trans <- trans[c(1,3)]
101101

102102
trans <- as_function(trans)

R/compat-plyr.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -74,7 +74,7 @@ id_var <- function(x, drop = FALSE) {
7474
#' Properties:
7575
#' - `order(id)` is equivalent to `do.call(order, df)`
7676
#' - rows containing the same data have the same value
77-
#' - if `drop = FALSE` then room for all possibilites
77+
#' - if `drop = FALSE` then room for all possibilities
7878
#'
7979
#' @param .variables list of variables
8080
#' @param drop Should unused factor levels be dropped?
@@ -124,10 +124,10 @@ id <- function(.variables, drop = FALSE) {
124124
res
125125
}
126126
}
127-
#' Count number of occurences for each unique combination of variables
127+
#' Count number of occurrences for each unique combination of variables
128128
#'
129129
#' Each unique combination of the variables in `df` given by `vars` will be
130-
#' identified and their occurences counted. If `wt_var` is given the counts will
130+
#' identified and their occurrences counted. If `wt_var` is given the counts will
131131
#' be weighted by the values in this column.
132132
#'
133133
#' @param df A data.frame

R/coord-quickmap.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -25,7 +25,7 @@ CoordQuickmap <- ggproto("CoordQuickmap", CoordCartesian,
2525
x.dist <- dist_central_angle(x.center + c(-0.5, 0.5), rep(y.center, 2))
2626
y.dist <- dist_central_angle(rep(x.center, 2), y.center + c(-0.5, 0.5))
2727
# NB: this makes the projection correct in the center of the plot and
28-
# increasingly less correct towards the edges. For regions of reasonnable
28+
# increasingly less correct towards the edges. For regions of reasonable
2929
# size, this seems to give better results than computing this ratio from
3030
# the total lat and lon span.
3131

R/geom-rug.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -95,7 +95,7 @@ GeomRug <- ggproto("GeomRug", Geom,
9595
rugs <- list()
9696
data <- coord$transform(data, panel_params)
9797

98-
# For coord_flip, coord$tranform does not flip the sides where to
98+
# For coord_flip, coord$transform does not flip the sides where to
9999
# draw the rugs. We have to flip them.
100100
if (inherits(coord, 'CoordFlip')) {
101101
sides <- chartr('tblr', 'rlbt', sides)

R/guides-.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -230,7 +230,7 @@ Guides <- ggproto(
230230
# here, one guide object for one scale
231231
#
232232
# 2. Guides$merge()
233-
# merge guide objects if they are overlayed
233+
# merge guide objects if they are overlaid
234234
# number of guide objects may be less than number of scales
235235
#
236236
# 3. Guides$process_layers()

R/margins.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -38,7 +38,7 @@ titleGrob <- function(label, x, y, hjust, vjust, angle = 0, gp = gpar(),
3838
return(zeroGrob())
3939
}
4040

41-
# We rotate the justifiation values to obtain the correct x and y reference point,
41+
# We rotate the justification values to obtain the correct x and y reference point,
4242
# since hjust and vjust are applied relative to the rotated text frame in textGrob
4343
just <- rotate_just(angle, hjust, vjust)
4444

R/scale-view.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -5,7 +5,7 @@
55
#' limits, dimension, breaks, labels, and minor breaks. They are used as
66
#' the immutable result of the trained scales that have been assigned
77
#' `limits` and a `continuous_range` from the coordinate system's
8-
#' implementation of scale expantion.
8+
#' implementation of scale expansion.
99
#'
1010
#' @param scale The scale from which to construct a view scale.
1111
#' @param limits The final scale limits

R/utilities.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -276,7 +276,7 @@ is.discrete <- function(x) {
276276
# the names of any columns that are not.
277277
# We define "data" as atomic types or lists, not functions or otherwise.
278278
# The `inherits(x, "Vector")` check is for checking S4 classes from Bioconductor
279-
# and wether they can be expected to follow behavior typical of vectors. See
279+
# and whether they can be expected to follow behavior typical of vectors. See
280280
# also #3835
281281
check_nondata_cols <- function(x) {
282282
idx <- (vapply(x, function(x) {
@@ -513,7 +513,7 @@ has_flipped_aes <- function(data, params = list(), main_is_orthogonal = NA,
513513
xmax <- data$xmax %||% params$xmax
514514
ymax <- data$ymax %||% params$ymax
515515

516-
# Does a single x or y aesthetic corespond to a specific orientation
516+
# Does a single x or y aesthetic correspond to a specific orientation
517517
if (!is.na(main_is_orthogonal) && xor(is.null(x), is.null(y))) {
518518
return(is.null(y) == main_is_orthogonal)
519519
}

_pkgdown.yml

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -32,7 +32,7 @@ reference:
3232
- title: Plot basics
3333
desc: >
3434
All ggplot2 plots begin with a call to `ggplot()`, supplying default data and
35-
aesthethic mappings, specified by `aes()`. You then add layers, scales,
35+
aesthetic mappings, specified by `aes()`. You then add layers, scales,
3636
coords and facets with `+`. To save a plot to disk, use `ggsave()`.
3737
contents:
3838
- ggplot
@@ -231,7 +231,7 @@ reference:
231231
for package authors to add methods that work like the base `plot()`
232232
function, generating useful default plots with little user interaction.
233233
`fortify()` turns objects into tidy data frames: it has largely been
234-
superceded by the [broom package](https://github.com/tidyverse/broom).
234+
superseded by the [broom package](https://github.com/tidyverse/broom).
235235
contents:
236236
- autoplot
237237
- autolayer

0 commit comments

Comments
 (0)