You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
Hi!
I encountered crashes of my R session in this specific misuse of dplyr. I was unable to break it down any further:
MWE:
library(dplyr)
a <- data.frame(x= 1)
b <- data.frame(y = character(), # runs fine with integer()
stringsAsFactors = F)
g <- function(y){1} # 1 or y
f <- function() { b %>% rowwise() %>% mutate(z = g(y))}
try(f())
print("f ran fine (with eror)")
try(a %>% mutate(b = f()))
print("f ran fine (with eror) within mutate")
try(a %>% rowwise() %>% mutate(b = f()))
print("f ran fine (with eror) within rowise mutate")
Output:
Error in mutate_impl(.data, dots) :
Value of SET_STRING_ELT() must be a 'CHARSXP' not a 'pairlist'
f ran fine (with eror)
Error : Value of SET_STRING_ELT() must be a 'CHARSXP' not a 'pairlist'
f ran fine (with eror) within mutate
<RSession crash>
Session info:
R version 3.2.1 (2015-06-18)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows 8 x64 (build 9200)
other attached packages:
[1] dplyr_0.4.2
all the best and much fun to the one taking it on,
Jan
The text was updated successfully, but these errors were encountered:
Hi!
I encountered crashes of my R session in this specific misuse of dplyr. I was unable to break it down any further:
MWE:
Output:
Session info:
all the best and much fun to the one taking it on,
Jan
The text was updated successfully, but these errors were encountered: