Skip to content

Commit

Permalink
chore: remove repetitive words (#5830)
Browse files Browse the repository at this point in the history
* 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>
  • Loading branch information
guqicun and teunbrand committed Apr 16, 2024
1 parent 1050f09 commit 9243e2f
Show file tree
Hide file tree
Showing 5 changed files with 6 additions and 6 deletions.
2 changes: 1 addition & 1 deletion NEWS
Original file line number Diff line number Diff line change
Expand Up @@ -28,7 +28,7 @@ NEW FEATURES
`example(position_jitterdodge)` for a potential usage. (@kevinushey, #932)

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

* Allow to use brewer palettes for continuous scales, through the new
Expand Down
2 changes: 1 addition & 1 deletion R/scale-.R
Original file line number Diff line number Diff line change
Expand Up @@ -388,7 +388,7 @@ binned_scale <- function(aesthetics, scale_name = deprecated(), palette, name =
#' which do not use the default implementation of this method). The output corresponds
#' to the transformed data value in aesthetic space (e.g., a color, line width, or size).
#'
#' - `rescale()` Rescale transformed data to the the range 0, 1. This is most useful for
#' - `rescale()` Rescale transformed data to the range 0, 1. This is most useful for
#' position scales. For continuous scales, `rescale()` uses the `rescaler` that
#' was provided to the constructor. `rescale()` does not apply `self$oob()` to
#' its input, which means that discrete values outside `limits` will be `NA`, and
Expand Down
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 tests/testthat/test-coord-train.R
Original file line number Diff line number Diff line change
Expand Up @@ -17,7 +17,7 @@ test_that("NA's don't appear in breaks", {

# First have to test that scale_breaks_positions will return a vector with NA
# This is a test to make sure the later tests will be useful!
# It's possible that changes to the the way that breaks are calculated will
# It's possible that changes to the way that breaks are calculated will
# make it so that scale_break_positions will no longer give NA for range 1, 12
expect_true(any(is.na(scale_x$break_positions())))
expect_true(any(is.na(scale_y$break_positions())))
Expand Down
4 changes: 2 additions & 2 deletions vignettes/articles/faq-axes.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -427,7 +427,7 @@ ggplot(mpg, aes(x = cty^2, y = log(hwy))) +
#| fig.alt = "A scatter plot showing the squared city miles per gallon on the
#| x-axis versus the base 10 logarithm of highway miles per gallon on the
#| y-axis for 234 cars. In the axis titles, the base 10 is indicated in
#| subscript on the y-axis and the power 2 is is indicated in superscript on
#| subscript on the y-axis and the power 2 is indicated in superscript on
#| the x-axis."
ggplot(mpg, aes(x = cty^2, y = log(hwy, base = 10))) +
geom_point() +
Expand All @@ -443,7 +443,7 @@ ggplot(mpg, aes(x = cty^2, y = log(hwy, base = 10))) +
#| fig.alt = "A scatter plot showing the squared city miles per gallon on the
#| x-axis versus the base 10 logarithm of highway miles per gallon on the
#| y-axis for 234 cars. In the axis titles, the base 10 is indicated in
#| subscript on the y-axis and the power 2 is is indicated in superscript on
#| subscript on the y-axis and the power 2 is indicated in superscript on
#| the x-axis."
ggplot(mpg, aes(x = cty^2, y = log(hwy, base = 10))) +
geom_point() +
Expand Down

0 comments on commit 9243e2f

Please sign in to comment.