Skip to content

Commit 9243e2f

Browse files
guqicunteunbrand
andauthored
chore: remove repetitive words (#5830)
* chore: remove repetitive words Signed-off-by: guqicun <guqicun@outlook.com> * regenerate docs --------- Signed-off-by: guqicun <guqicun@outlook.com> Co-authored-by: Teun van den Brand <tahvdbrand@gmail.com>
1 parent 1050f09 commit 9243e2f

File tree

5 files changed

+6
-6
lines changed

5 files changed

+6
-6
lines changed

NEWS

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -28,7 +28,7 @@ NEW FEATURES
2828
`example(position_jitterdodge)` for a potential usage. (@kevinushey, #932)
2929

3030
* Allow specifying only one of the limits in a scale and use the automatic
31-
calculation of the other limit by passing NA to to the limit function,
31+
calculation of the other limit by passing NA to the limit function,
3232
`xlim()` or `ylim()` (@jimhester, #557).
3333

3434
* Allow to use brewer palettes for continuous scales, through the new

R/scale-.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -388,7 +388,7 @@ binned_scale <- function(aesthetics, scale_name = deprecated(), palette, name =
388388
#' which do not use the default implementation of this method). The output corresponds
389389
#' to the transformed data value in aesthetic space (e.g., a color, line width, or size).
390390
#'
391-
#' - `rescale()` Rescale transformed data to the the range 0, 1. This is most useful for
391+
#' - `rescale()` Rescale transformed data to the range 0, 1. This is most useful for
392392
#' position scales. For continuous scales, `rescale()` uses the `rescaler` that
393393
#' was provided to the constructor. `rescale()` does not apply `self$oob()` to
394394
#' its input, which means that discrete values outside `limits` will be `NA`, and

man/ggplot2-ggproto.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

tests/testthat/test-coord-train.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -17,7 +17,7 @@ test_that("NA's don't appear in breaks", {
1717

1818
# First have to test that scale_breaks_positions will return a vector with NA
1919
# This is a test to make sure the later tests will be useful!
20-
# It's possible that changes to the the way that breaks are calculated will
20+
# It's possible that changes to the way that breaks are calculated will
2121
# make it so that scale_break_positions will no longer give NA for range 1, 12
2222
expect_true(any(is.na(scale_x$break_positions())))
2323
expect_true(any(is.na(scale_y$break_positions())))

vignettes/articles/faq-axes.Rmd

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -427,7 +427,7 @@ ggplot(mpg, aes(x = cty^2, y = log(hwy))) +
427427
#| fig.alt = "A scatter plot showing the squared city miles per gallon on the
428428
#| x-axis versus the base 10 logarithm of highway miles per gallon on the
429429
#| y-axis for 234 cars. In the axis titles, the base 10 is indicated in
430-
#| subscript on the y-axis and the power 2 is is indicated in superscript on
430+
#| subscript on the y-axis and the power 2 is indicated in superscript on
431431
#| the x-axis."
432432
ggplot(mpg, aes(x = cty^2, y = log(hwy, base = 10))) +
433433
geom_point() +
@@ -443,7 +443,7 @@ ggplot(mpg, aes(x = cty^2, y = log(hwy, base = 10))) +
443443
#| fig.alt = "A scatter plot showing the squared city miles per gallon on the
444444
#| x-axis versus the base 10 logarithm of highway miles per gallon on the
445445
#| y-axis for 234 cars. In the axis titles, the base 10 is indicated in
446-
#| subscript on the y-axis and the power 2 is is indicated in superscript on
446+
#| subscript on the y-axis and the power 2 is indicated in superscript on
447447
#| the x-axis."
448448
ggplot(mpg, aes(x = cty^2, y = log(hwy, base = 10))) +
449449
geom_point() +

0 commit comments

Comments
 (0)