Skip to content

Commit

Permalink
Add trim_ws argument to read_delim
Browse files Browse the repository at this point in the history
  • Loading branch information
noamross committed Nov 13, 2015
1 parent ef750db commit 2ccd965
Show file tree
Hide file tree
Showing 2 changed files with 7 additions and 7 deletions.
4 changes: 2 additions & 2 deletions R/read_delim.R
Expand Up @@ -85,11 +85,11 @@ read_delim <- function(file, delim, quote = '"',
escape_backslash = FALSE, escape_double = TRUE,
col_names = TRUE, col_types = NULL,
locale = default_locale(),
na = c("", "NA"), comment = "",
na = c("", "NA"), comment = "", trim_ws = FALSE,
skip = 0, n_max = -1, progress = interactive()) {
tokenizer <- tokenizer_delim(delim, quote = quote,
escape_backslash = escape_backslash, escape_double = escape_double,
na = na, comment = comment)
na = na, comment = comment, trim_ws = trim_ws)
read_delimited(file, tokenizer, col_names = col_names, col_types = col_types,
locale = locale, skip = skip, comment = comment, n_max = n_max,
progress = progress)
Expand Down
10 changes: 5 additions & 5 deletions man/read_delim.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 2ccd965

Please sign in to comment.