Skip to content

Commit

Permalink
Merge pull request #4178 from tidyverse/4174/revert_4094
Browse files Browse the repository at this point in the history
revert #4094 for now
  • Loading branch information
romainfrancois authored Feb 12, 2019
2 parents d618f7a + 81bf77e commit 6a5fd4b
Show file tree
Hide file tree
Showing 2 changed files with 3 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/colwise-mutate.R
Original file line number Diff line number Diff line change
Expand Up @@ -323,8 +323,8 @@ manip_apply_syms <- function(funs, syms, tbl) {
dim(out) <- c(length(syms), length(funs))
for (i in seq_along(syms)) {
for (j in seq_along(funs)) {
var_call <- call('$', sym(".data"), sym(syms[[i]]))
out[[i, j]] <- expr_substitute(funs[[j]], quote(.), var_call)
var_sym <- sym(syms[[i]])
out[[i, j]] <- expr_substitute(funs[[j]], quote(.), var_sym)
}
}
dim(out) <- NULL
Expand Down
1 change: 1 addition & 0 deletions tests/testthat/test-colwise-mutate.R
Original file line number Diff line number Diff line change
Expand Up @@ -302,6 +302,7 @@ test_that("*_(all,at) handle utf-8 names (#2967)", {
})

test_that("mutate_all() handles non syntactic names (#4094)", {
skip("for now, will fix this after 0.8.0")
tbl <- tibble(`..1` = "a")
res <- mutate_all(tbl, toupper)
expect_equal(names(tbl), names(res))
Expand Down

0 comments on commit 6a5fd4b

Please sign in to comment.