-
Notifications
You must be signed in to change notification settings - Fork 287
Closed
Description
In the simple example below, there is a difference between df01 and df02:
library(readr)
set.seed(1234)
n <- 1e3
dat <- data.frame(a=as.integer(sample(1:1000,n,replace=TRUE)),
b=rnorm(n),
c=sample(c("foo","bar","baz","qux","quux"),n,replace=TRUE),
d=sample(c(TRUE,FALSE),n,replace=TRUE),
stringsAsFactors=FALSE)
write.csv(dat,"test.csv",row.names = FALSE)
write_csv(dat,"test1.csv")
df01 <- read_csv("test.csv")
df02 <- read_csv("test1.csv")
Metadata
Metadata
Assignees
Labels
No labels