Other files ignored by Codecov
man/read_lines.Rd
has changed.
29 | 29 | #' |
|
30 | 30 | #' write_lines(airquality$Ozone, tmp, na = "-1") |
|
31 | 31 | #' read_lines(tmp) |
|
32 | - | read_lines <- function(file, skip = 0, skip_empty_rows = FALSE, n_max = Inf, |
|
32 | + | read_lines <- function(file, skip = 0, skip_empty_rows = FALSE, n_max = -1, |
|
33 | 33 | locale = default_locale(), |
|
34 | 34 | na = character(), |
|
35 | 35 | progress = show_progress()) { |
|
36 | - | vroom::vroom_lines(file, skip = skip, n_max = n_max, locale = locale, progress = progress) |
|
37 | 36 | if (empty_file(file)) { |
|
38 | 37 | return(character()) |
|
39 | 38 | } |