Skip to content

Commit 89f1861

Browse files
authored
Fix some typos (#1573)
1 parent a66c71e commit 89f1861

File tree

5 files changed

+6
-6
lines changed

5 files changed

+6
-6
lines changed

NEWS.md

+1-1
Original file line numberDiff line numberDiff line change
@@ -673,7 +673,7 @@ Packing and chopping are interesting primarily because they are the atomic opera
673673

674674
* `crossing()`, `nesting()`, and `expand()` have been rewritten to use
675675
the vctrs package. This should not affect much existing code, but
676-
considerably simplies the implementation and ensures that these functions
676+
considerably simplifies the implementation and ensures that these functions
677677
work consistently across all generalised vectors (#557). As part of this
678678
alignment, these functions now only drop `NULL` inputs, not any 0-length
679679
vector.

tests/testthat/test-nest-legacy.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -99,7 +99,7 @@ test_that("unnesting combines atomic vectors", {
9999
expect_equal(unnest_legacy(df)$x, 1:10)
100100
})
101101

102-
test_that("unesting combines augmented vectors", {
102+
test_that("unnesting combines augmented vectors", {
103103
df <- tibble::tibble(x = as.list(as.factor(letters[1:3])))
104104
expect_equal(unnest_legacy(df)$x, factor(letters[1:3]))
105105
})

tests/testthat/test-unnest.R

+2-2
Original file line numberDiff line numberDiff line change
@@ -25,7 +25,7 @@ test_that("bad inputs generate errors", {
2525
expect_snapshot((expect_error(unnest(df, y))))
2626
})
2727

28-
test_that("unesting combines augmented vectors", {
28+
test_that("unnesting combines augmented vectors", {
2929
df <- tibble(x = as.list(as.factor(letters[1:3])))
3030
expect_equal(unnest(df, x)$x, factor(letters[1:3]))
3131
})
@@ -213,7 +213,7 @@ test_that("unnesting typed lists of NULLs retains ptype", {
213213
expect_identical(out, tibble(x = integer(), a = integer()))
214214
})
215215

216-
test_that("ptype can be overriden manually (#1158)", {
216+
test_that("ptype can be overridden manually (#1158)", {
217217
df <- tibble(
218218
a = list("a", c("b", "c")),
219219
b = list(1, c(2, 3)),

vignettes/pivot.Rmd

+1-1
Original file line numberDiff line numberDiff line change
@@ -189,7 +189,7 @@ who %>%
189189
)
190190
```
191191

192-
Doing it this way is a little more efficient than doing a mutate after the fact, `pivot_longer()` only has to transform one occurence of each name where a `mutate()` would need to transform many repetitions.
192+
Doing it this way is a little more efficient than doing a mutate after the fact, `pivot_longer()` only has to transform one occurrence of each name where a `mutate()` would need to transform many repetitions.
193193

194194
### Multiple observations per row
195195

vignettes/rectangle.Rmd

+1-1
Original file line numberDiff line numberDiff line change
@@ -148,7 +148,7 @@ chars2 %>%
148148

149149
## Geocoding with google
150150

151-
Next we'll tackle a more complex form of data that comes from Google's geocoding service, stored in the repurssive package
151+
Next we'll tackle a more complex form of data that comes from Google's geocoding service, stored in the repurrrsive package
152152

153153
```{r}
154154
repurrrsive::gmaps_cities

0 commit comments

Comments
 (0)