Skip to content

Commit

Permalink
Don't use magrittr in this test
Browse files Browse the repository at this point in the history
Fixes #203
  • Loading branch information
jennybc committed Sep 12, 2018
1 parent eba1304 commit 6424afb
Showing 1 changed file with 2 additions and 6 deletions.
8 changes: 2 additions & 6 deletions tests/testthat/test-undo.R
Original file line number Diff line number Diff line change
Expand Up @@ -145,14 +145,10 @@ test_that("reprex_invert() can name outfile based on input filepath", {
test_that("reprex_invert(venue = 'gh') doesn't strip leading ws", {
skip_on_cran()
temporarily()
input <- c(
"library(magrittr)",
"mtcars[, 1:2] %>%",
" head(n = 1)"
)
input <- c("head(", " letters)")
reprexed <- reprex(
input = input, venue = "gh", advertise = FALSE, show = FALSE
)
inverted <- reprex_invert(reprexed, venue = "gh")
expect_match(inverted, input[3], all = FALSE, fixed = TRUE)
expect_match(inverted, input[2], all = FALSE, fixed = TRUE)
})

0 comments on commit 6424afb

Please sign in to comment.