Giter VIP home page Giter VIP logo

tidyverse's Introduction

tidyverse

CRAN status R-CMD-check Codecov test coverage

Overview

The tidyverse is a set of packages that work in harmony because they share common data representations and API design. The tidyverse package is designed to make it easy to install and load core packages from the tidyverse in a single command.

If you’d like to learn how to use the tidyverse effectively, the best place to start is R for Data Science (2e).

Installation

# Install from CRAN
install.packages("tidyverse")
# Install the development version from GitHub
# install.packages("pak")
pak::pak("tidyverse/tidyverse")

If you’re compiling from source, you can run pak::pkg_system_requirements("tidyverse"), to see the complete set of system packages needed on your machine.

Usage

library(tidyverse) will load the core tidyverse packages:

You also get a condensed summary of conflicts with other packages you have loaded:

library(tidyverse)
#> ── Attaching core tidyverse packages ─────────────────── tidyverse 2.0.0.9000 ──
#> ✔ dplyr     1.1.3     ✔ readr     2.1.4
#> ✔ forcats   1.0.0     ✔ stringr   1.5.0
#> ✔ ggplot2   3.4.4     ✔ tibble    3.2.1
#> ✔ lubridate 1.9.3     ✔ tidyr     1.3.0
#> ✔ purrr     1.0.2     
#> ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
#> ✖ dplyr::filter() masks stats::filter()
#> ✖ dplyr::lag()    masks stats::lag()
#> ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors

You can see conflicts created later with tidyverse_conflicts():

library(MASS)
#> 
#> Attaching package: 'MASS'
#> The following object is masked from 'package:dplyr':
#> 
#>     select
tidyverse_conflicts()
#> ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
#> ✖ dplyr::filter() masks stats::filter()
#> ✖ dplyr::lag()    masks stats::lag()
#> ✖ MASS::select()  masks dplyr::select()
#> ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors

And you can check that all tidyverse packages are up-to-date with tidyverse_update():

tidyverse_update()
#> The following packages are out of date:
#>  * broom (0.4.0 -> 0.4.1)
#>  * DBI   (0.4.1 -> 0.5)
#>  * Rcpp  (0.12.6 -> 0.12.7)
#>  
#> Start a clean R session then run:
#> install.packages(c("broom", "DBI", "Rcpp"))

Packages

As well as the core tidyverse, installing this package also installs a selection of other packages that you’re likely to use frequently, but probably not in every analysis. This includes packages for:

  • Working with specific types of vectors:

    • hms, for times.
  • Importing other types of data:

    • feather, for sharing with Python and other languages.
    • haven, for SPSS, SAS and Stata files.
    • httr, for web apis.
    • jsonlite for JSON.
    • readxl, for .xls and .xlsx files.
    • rvest, for web scraping.
    • xml2, for XML.
  • Modelling

    • modelr, for modelling within a pipeline
    • broom, for turning models into tidy data

Code of Conduct

Please note that the tidyverse project is released with a Contributor Code of Conduct. By contributing to this project, you agree to abide by its terms.

tidyverse's People

Stargazers

 avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar

Watchers

 avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar

tidyverse's Issues

Error while loading 'tidyverse' package for R version 3.3.3

I am getting an error when I try to load 'tidyverse' library in R Studio. I installed the package without any error.
This is the log, when I installed the package:

install.packages("tidyverse")
Installing package into ‘C:/Users/Shadz/Documents/R/win-library/3.3’
(as ‘lib’ is unspecified)
also installing the dependency ‘jsonlite’

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/jsonlite_1.3.zip'
Content type 'application/zip' length 1122936 bytes (1.1 MB)
downloaded 1.1 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/tidyverse_1.1.1.zip'
Content type 'application/zip' length 41948 bytes (40 KB)
downloaded 40 KB

But when I try to load the library, I get the following error.

library(tidyverse)
Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) :
there is no package called ‘stringi’
Error: package or namespace load failed for ‘tidyverse’

Thanks & Regards,
Shatadru Saha

Is tidyverse meant to keep up with the latest versions of each package?

I had to update ggplot to version 2.2.0 when I installed ggthemes. Unfortunately this caused ggplot2 to break as tibble (v1.0), installed using tidyverse, was not the most up to date version (v1.2). Trying to reinstall tidyverse doesn't actually update tibble to the latest version.

Total noob got stuck before even start, plz help!

Trying to install the tidyverse package and then these:

install.packages("tidyverse")
Warning in install.packages :
cannot open URL 'http://www.stats.ox.ac.uk/pub/RWin/src/contrib/PACKAGES.gz': HTTP status was '403 Forbidden'
Warning in install.packages :
cannot open URL 'http://www.stats.ox.ac.uk/pub/RWin/src/contrib/PACKAGES': HTTP status was '403 Forbidden'
Warning in install.packages :
unable to access index for repository http://www.stats.ox.ac.uk/pub/RWin/src/contrib:
cannot open URL 'http://www.stats.ox.ac.uk/pub/RWin/src/contrib/PACKAGES'
Installing package into ‘C:/Users/asus/Documents/R/win-library/3.3’
(as ‘lib’ is unspecified)
Warning in install.packages :
cannot open URL 'http://www.stats.ox.ac.uk/pub/RWin/src/contrib/PACKAGES.gz': HTTP status was '403 Forbidden'
Warning in install.packages :
cannot open URL 'http://www.stats.ox.ac.uk/pub/RWin/src/contrib/PACKAGES': HTTP status was '403 Forbidden'
Warning in install.packages :
unable to access index for repository http://www.stats.ox.ac.uk/pub/RWin/src/contrib:
cannot open URL 'http://www.stats.ox.ac.uk/pub/RWin/src/contrib/PACKAGES'
also installing the dependencies ‘colorspace’, ‘mnormt’, ‘RColorBrewer’, ‘dichromat’, ‘munsell’, ‘labeling’, ‘plyr’, ‘psych’, ‘reshape2’, ‘assertthat’, ‘R6’, ‘Rcpp’, ‘lazyeval’, ‘DBI’, ‘BH’, ‘digest’, ‘gtable’, ‘scales’, ‘mime’, ‘curl’, ‘openssl’, ‘stringi’, ‘selectr’, ‘broom’, ‘dplyr’, ‘forcats’, ‘ggplot2’, ‘haven’, ‘httr’, ‘hms’, ‘jsonlite’, ‘lubridate’, ‘magrittr’, ‘modelr’, ‘purrr’, ‘readr’, ‘readxl’, ‘stringr’, ‘tibble’, ‘rvest’, ‘tidyr’, ‘xml2’

Warning in install.packages :
cannot open URL 'http://www.stats.ox.ac.uk/pub/RWin/bin/windows/contrib/3.3/PACKAGES.gz': HTTP status was '403 Forbidden'
Warning in install.packages :
cannot open URL 'http://www.stats.ox.ac.uk/pub/RWin/bin/windows/contrib/3.3/PACKAGES': HTTP status was '403 Forbidden'
Warning in install.packages :
unable to access index for repository http://www.stats.ox.ac.uk/pub/RWin/bin/windows/contrib/3.3:
cannot open URL 'http://www.stats.ox.ac.uk/pub/RWin/bin/windows/contrib/3.3/PACKAGES'

There are binary versions available but the source versions are later:
binary source needs_compilation
psych 1.6.12 1.7.3.21 FALSE
stringi 1.1.2 1.1.3 TRUE
readr 1.0.0 1.1.0 TRUE

Binaries will be installed
trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/colorspace_1.3-2.zip'
Content type 'application/zip' length 441966 bytes (431 KB)
downloaded 431 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/mnormt_1.5-5.zip'
Content type 'application/zip' length 101019 bytes (98 KB)
downloaded 98 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/RColorBrewer_1.1-2.zip'
Content type 'application/zip' length 26706 bytes (26 KB)
downloaded 26 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/dichromat_2.0-0.zip'
Content type 'application/zip' length 147728 bytes (144 KB)
downloaded 144 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/munsell_0.4.3.zip'
Content type 'application/zip' length 134184 bytes (131 KB)
downloaded 131 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/labeling_0.3.zip'
Content type 'application/zip' length 40914 bytes (39 KB)
downloaded 39 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/plyr_1.8.4.zip'
Content type 'application/zip' length 1188852 bytes (1.1 MB)
downloaded 340 KB

Warning in install.packages :
downloaded length 348160 != reported length 1188852
trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/reshape2_1.4.2.zip'
Content type 'application/zip' length 571809 bytes (558 KB)
downloaded 558 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/assertthat_0.1.zip'
Content type 'application/zip' length 44880 bytes (43 KB)
downloaded 43 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/R6_2.2.0.zip'
Content type 'application/zip' length 197000 bytes (192 KB)
downloaded 192 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/Rcpp_0.12.10.zip'
Content type 'application/zip' length 3316221 bytes (3.2 MB)
downloaded 3.2 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/lazyeval_0.2.0.zip'
Content type 'application/zip' length 139400 bytes (136 KB)
downloaded 136 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/DBI_0.6.zip'
Content type 'application/zip' length 743135 bytes (725 KB)
downloaded 725 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/BH_1.62.0-1.zip'
Content type 'application/zip' length 16150075 bytes (15.4 MB)
downloaded 15.4 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/digest_0.6.12.zip'
Content type 'application/zip' length 172740 bytes (168 KB)
downloaded 168 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/gtable_0.2.0.zip'
Content type 'application/zip' length 57840 bytes (56 KB)
downloaded 56 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/scales_0.4.1.zip'
Content type 'application/zip' length 675417 bytes (659 KB)
downloaded 384 KB

Warning in install.packages :
downloaded length 393216 != reported length 675417
trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/mime_0.5.zip'
Content type 'application/zip' length 37483 bytes (36 KB)
downloaded 36 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/curl_2.3.zip'
Content type 'application/zip' length 3059643 bytes (2.9 MB)
downloaded 2.9 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/openssl_0.9.6.zip'
Content type 'application/zip' length 3568151 bytes (3.4 MB)
downloaded 3.4 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/stringi_1.1.2.zip'
Content type 'application/zip' length 14264524 bytes (13.6 MB)
downloaded 13.6 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/selectr_0.3-1.zip'
Content type 'application/zip' length 160998 bytes (157 KB)
downloaded 157 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/broom_0.4.2.zip'
Content type 'application/zip' length 1604727 bytes (1.5 MB)
downloaded 1.5 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/dplyr_0.5.0.zip'
Content type 'application/zip' length 2557794 bytes (2.4 MB)
downloaded 2.4 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/forcats_0.2.0.zip'
Content type 'application/zip' length 164197 bytes (160 KB)
downloaded 160 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/ggplot2_2.2.1.zip'
Content type 'application/zip' length 2761741 bytes (2.6 MB)
downloaded 348 KB

Warning in install.packages :
downloaded length 356352 != reported length 2761741
trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/haven_1.0.0.zip'
Content type 'application/zip' length 818931 bytes (799 KB)
downloaded 799 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/httr_1.2.1.zip'
Content type 'application/zip' length 280238 bytes (273 KB)
downloaded 273 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/hms_0.3.zip'
Content type 'application/zip' length 20801 bytes (20 KB)
downloaded 20 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/jsonlite_1.3.zip'
Content type 'application/zip' length 1123008 bytes (1.1 MB)
downloaded 1.1 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/lubridate_1.6.0.zip'
Content type 'application/zip' length 654189 bytes (638 KB)
downloaded 638 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/magrittr_1.5.zip'
Content type 'application/zip' length 149811 bytes (146 KB)
downloaded 146 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/modelr_0.1.0.zip'
Content type 'application/zip' length 129837 bytes (126 KB)
downloaded 126 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/purrr_0.2.2.zip'
Content type 'application/zip' length 863164 bytes (842 KB)
downloaded 842 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/readr_1.0.0.zip'
Content type 'application/zip' length 1204429 bytes (1.1 MB)
downloaded 1.1 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/readxl_0.1.1.zip'
Content type 'application/zip' length 818347 bytes (799 KB)
downloaded 799 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/stringr_1.2.0.zip'
Content type 'application/zip' length 148693 bytes (145 KB)
downloaded 145 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/tibble_1.2.zip'
Content type 'application/zip' length 619543 bytes (605 KB)
downloaded 605 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/rvest_0.3.2.zip'
Content type 'application/zip' length 853345 bytes (833 KB)
downloaded 833 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/tidyr_0.6.1.zip'
Content type 'application/zip' length 860971 bytes (840 KB)
downloaded 840 KB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/xml2_1.1.1.zip'
Content type 'application/zip' length 3512620 bytes (3.3 MB)
downloaded 3.3 MB

trying URL 'https://cran.rstudio.com/bin/windows/contrib/3.3/tidyverse_1.1.1.zip'
Content type 'application/zip' length 41956 bytes (40 KB)
downloaded 40 KB

package ‘colorspace’ successfully unpacked and MD5 sums checked
package ‘mnormt’ successfully unpacked and MD5 sums checked
package ‘RColorBrewer’ successfully unpacked and MD5 sums checked
package ‘dichromat’ successfully unpacked and MD5 sums checked
package ‘munsell’ successfully unpacked and MD5 sums checked
package ‘labeling’ successfully unpacked and MD5 sums checked
Warning in install.packages :
error 1 in extracting from zip file
Warning in install.packages :
cannot open compressed file 'plyr/DESCRIPTION', probable reason 'No such file or directory'
Error in install.packages : cannot open the connection


Environment:
Windows 10 Home
R x64 3.3.2

Please Help and Thank you!

Why doesn't forcats load?

require(tidyverse)
#> Loading required package: tidyverse
#> Loading tidyverse: ggplot2
#> Loading tidyverse: tibble
#> Loading tidyverse: tidyr
#> Loading tidyverse: readr
#> Loading tidyverse: purrr
#> Loading tidyverse: dplyr
#> Conflicts with tidy packages ----------------------------------------------
#> filter(): dplyr, stats
#> lag():    dplyr, stats
tidyverse_update()
#> All tidyverse packages up-to-date
tidyverse_conflicts()
#> Conflicts with tidy packages ----------------------------------------------
#> filter(): dplyr, stats
#> lag():    dplyr, stats
as_factor(c("a", "z", "g"))
#> Error in eval(expr, envir, enclos): could not find function "as_factor"

devtools, roxygen2 & testthat

Do you have any plans to include these very useful pkgs? Maybe something like a dev branch on this repo that is the tidyverse plus the other three pkgs, or some variation on dev_mode(on=TRUE)?

Tidyverse installation error

On installing the package (using ref f27f74c) as

devtools::install_github('hadley/tidyverse')

I get the following:

Error : .onAttach failed in attachNamespace() for 'tidyverse', details:
  call: rlang::as_function(.f, ...)
  error: unused argument (collapse = ", ")
Error: loading failed
Execution halted

Not sure if this is due to rlang though (have installed that using ref 0756eaf).

Error on tidyverse_update()

Update produces the following error message after a devtools install.

tidyverse_update()
Error in FUN(X[[i]], ...) : package ‘psych’ not found

Session info ----------------------------------------------------------
setting value
version R version 3.3.1 (2016-06-21)
system x86_64, mingw32
ui RStudio (0.99.903)
language (EN)
collate English_United States.1252
tz America/New_York
date 2016-09-06

Packages --------------------------------------------------------------
package * version date source
assertthat 0.1 2013-12-06 CRAN (R 3.3.1)
colorspace 1.2-6 2015-03-11 CRAN (R 3.3.1)
DBI 0.5 2016-08-11 CRAN (R 3.3.1)
devtools 1.12.0 2016-06-24 CRAN (R 3.3.1)
digest 0.6.10 2016-08-02 CRAN (R 3.3.1)
dplyr * 0.5.0 2016-06-24 CRAN (R 3.3.1)
ggplot2 * 2.1.0 2016-03-01 CRAN (R 3.3.1)
gtable 0.2.0 2016-02-26 CRAN (R 3.3.1)
magrittr 1.5 2014-11-22 CRAN (R 3.3.1)
memoise 1.0.0 2016-01-29 CRAN (R 3.3.1)
munsell 0.4.3 2016-02-13 CRAN (R 3.3.1)
plyr 1.8.4 2016-06-08 CRAN (R 3.3.1)
purrr * 0.2.2 2016-06-18 CRAN (R 3.3.1)
R6 2.1.3 2016-08-19 CRAN (R 3.3.1)
Rcpp 0.12.6 2016-07-19 CRAN (R 3.3.1)
readr * 1.0.0 2016-08-03 CRAN (R 3.3.1)
rsconnect 0.4.3 2016-05-02 CRAN (R 3.3.1)
scales 0.4.0 2016-02-26 CRAN (R 3.3.1)
tibble * 1.2 2016-08-26 CRAN (R 3.3.1)
tidyr * 0.6.0 2016-08-12 CRAN (R 3.3.1)
tidyverse * 0.0.0.9000 2016-09-06 Github (2903dbc)
withr 1.0.2 2016-06-20 CRAN (R 3.3.1)

Intra-tidyverse masking

Is there an order, or a method, of installing the secondary tidyverse packages (hms stringr, etc.) such that they do not mask each other's functions?

For instance, with my current order, I get hms() masked from hms by lubridate, as_factor() masked from forecats by haven, guess_encoding() masked from readr, and bootstrap() masked from modelr by broom.

If these conflicts are illusory, e.g. the masking functions are identical to the masked functions, a reassuring comment in the tidyverse documentation would be appreciated.

If the conflicts are real and can not be eliminated by an installation method, then I would put this forward as a feature request: name changes such that tidyverse packages can be installed in any combination and order without masking one another's functions.

cannot download forcats 0.1.0 from cran.wustl.edu

Apparently some of the CRAN mirrors do not have forcats 0.1.0:

> install.packages("forcats")
trying URL 'http://cran.wustl.edu/src/contrib/forcats_0.1.0.tar.gz'
Error in download.file(url, destfile, method, mode = "wb", ...) :
  cannot open URL 'http://cran.wustl.edu/src/contrib/forcats_0.1.0.tar.gz'

Installation works correctly using other mirrors:

> install.packages("tidyverse", repos="http://cran.us.r-project.org")

Speed of library(tidyverse)

When I load the tidyverse there is a noticeable pause at Conflicts with tidy packages. Are there any easy ways to speed that up? As a secondary issue, the timing reported by system.time() or profvis (~150ms) is substantially faster than the actual human time that elapses (> 1 sec). Maybe that is neither here nor there.

tidyverse ingest conventions

The requested brain dump to get this started.

  • Function that reads a thingy should be named read_thingy(). The opposite, when it exists, should be named write_thingy().
  • If it makes sense, return a tibble.
    • Any package that creates tibbles should import tibble, to reduce gotchas around, e.g., the drop = FALSE behaviour of [ or the lack of partial matching on $.
    • If thingy has no data, return a tibble with 0 rows and 0 columns.
  • Don't have row names.
  • col_names is the tidyverse answer to header = TRUE. Either logical indicating that first row gives variable names or character vector of names.
  • Don't mess with column names, i.e. don't modify non-syntactic names. Exceptions:
    • Fill in missing column names.
    • De-duplicate column names.
  • Don't coerce character to factor, stringsAsFactors = FALSE.
  • Do guess column types under what circumstances? according to what rules?
    • Provide control over how much data to use for the guessing, guess_max = min(1000, n_max)*
    • Recognize dates and date-times, for some universe of default formats. And always convert to POSIXct?
  • col_types is the tidyverse answer to colClasses. There is an entire system for type specification, with short codes or more general "collectors".
    • consider readr's "problems" and printed/returned colspec
  • something about locale
  • something about UTF-8 encoding
  • Explicit control over rows to skip, unrelated to the data: skip = 0, n_max = Inf.
  • Control over rows (or parts thereof) to skip, based on the data
    • comment
    • a vector of NA values. Use quoted_na to specify what happens to "NA".
  • Something about empty rows/columns. Proposal: include and fill with NA when leading (and not explicitly skipped) or embedded. Treatment of trailing empty rows/columns will depend on context (e.g. possible to include with readr, impossible with readxl).
  • something about reading from file, compressed file, URL, connection, memory
  • something about chunked reading
  • whitespace trimming?
  • progress?
  • Recommendations for implementation? Or a package?

Conflicts within the tidyverse are not consistently called out

I am specifically thinking of jsonlite::flatten().

tidyverse then jsonlite: we're notified that jsonlite::flatten() masks purrr::flatten(). But not reported as a conflict.

library(tidyverse)
#> Loading tidyverse: ggplot2
#> Loading tidyverse: tibble
#> Loading tidyverse: tidyr
#> Loading tidyverse: readr
#> Loading tidyverse: purrr
#> Loading tidyverse: dplyr
#> Conflicts with tidy packages ----------------------------------------------
#> filter(): dplyr, stats
#> lag():    dplyr, stats
library(jsonlite)
#> 
#> Attaching package: 'jsonlite'
#> The following object is masked from 'package:purrr':
#> 
#>     flatten
tidyverse_conflicts()
#> Conflicts with tidy packages ----------------------------------------------
#> filter(): dplyr, stats
#> lag():    dplyr, stats

jsonlite then tidyverse: we don't learn that purrr::flatten() masks jsonlite::flatten(). Still not reported as a conflict.

library(jsonlite)
library(tidyverse)
#> Loading tidyverse: ggplot2
#> Loading tidyverse: tibble
#> Loading tidyverse: tidyr
#> Loading tidyverse: readr
#> Loading tidyverse: purrr
#> Loading tidyverse: dplyr
#> Conflicts with tidy packages ----------------------------------------------
#> filter(): dplyr, stats
#> lag():    dplyr, stats
tidyverse_conflicts()
#> Conflicts with tidy packages ----------------------------------------------
#> filter(): dplyr, stats
#> lag():    dplyr, stats

jsonlite then purrr: we learn that purrr::flatten() masks jsonlite::flatten().

library(jsonlite)
library(purrr)
#> 
#> Attaching package: 'purrr'
#> The following object is masked from 'package:jsonlite':
#> 
#>     flatten

tidyverse_conflicts() gives spurious messages with data objects

Here's an example with the mpg data frame from ggplot2:

> library(tidyverse)
Loading tidyverse: ggplot2
Loading tidyverse: tibble
Loading tidyverse: tidyr
Loading tidyverse: readr
Loading tidyverse: purrr
Loading tidyverse: dplyr
Conflicts with tidy packages -----------------------------------------------------------
filter(): dplyr, stats
lag():    dplyr, stats

> data(mpg)
> tidyverse_conflicts()
Conflicts with tidy packages -----------------------------------------------------------
filter(): dplyr, stats
lag():    dplyr, stats
mpg():    ggplot2, .GlobalEnv

Latest tidyverse build doesn't load

Hello, all!

Forgive me if this is my failing; I'm mighty new to R and the tidyverse.

The latest packages on CRAN mirrors seems to be corrupted. Here's what we get in both R and RStudio on both machines we've installed to.

install.packages("tidyverse")
trying URL 'https://cran.revolutionanalytics.com/bin/macosx/mavericks/contrib/3.3/tidyverse_1.1.1.tgz'
Content type 'application/octet-stream' length 37228 bytes (36 KB)
==================================================
downloaded 36 KB

The downloaded binary packages are in
/var/folders/4s/646fsd2d5zzdylghrvwwj76m0000gn/T//Rtmp1LD6W9/downloaded_packages

library(tidyverse)
Error : object ‘as_factor’ is not exported by 'namespace:forcats'
Error: package or namespace load failed for ‘tidyverse’

I've sort of worked around it by manually retrieving the earlier release and installing 1.0.0 using the package installers, though I'm not entirely confident that fixes everything. I do get the expected loading messages.

Thanks!

Should DESCRIPTION specify minimum versions?

It seems like this would make it easier to make sure that the supported packages are all up to date (especially on larger shared machines where we have to ask IT to update packages one at a time).

If this is a good idea, I'd be happy to write a script that would find the most recent CRAN version numbers.

ERROR: dependency 'feather' is not available for package 'tidyverse'

I'm having an error when I try to install package tidyverse in Windows 64 bit. It appears that the problem is with package feather not being available from CRAN in complied format.

> install.packages(pkgs = "tidyverse")
also installing the dependencyfeatherThere is a binary version available but the source version is later:
          binary source needs_compilation
tidyverse  1.0.0  1.1.0             FALSE

Package which is only available in source form, and may need compilation of C/C++/Fortran:featherThese will not be installed
installing the source packagetidyversetrying URL 'http://cran.cnr.berkeley.edu/src/contrib/tidyverse_1.1.0.tar.gz'
Content type 'application/x-gzip' length 23334 bytes (22 KB)
downloaded 22 KB

ERROR: dependency 'feather' is not available for package 'tidyverse'
* removing 'C:/Program Files/R/R-3.2.5/library/tidyverse'
Warning in install.packages :
  running command '"C:/PROGRA~1/R/R-32~1.5/bin/x64/R" CMD INSTALL -l "C:\Program Files\R\R-3.2.5\library" C:\Users\estolen\AppData\Local\Temp\1\RtmpYrN4DW/downloaded_packages/tidyverse_1.1.0.tar.gz' had status 1
Warning in install.packages :
  installation of packagetidyversehad non-zero exit status

> install.packages("feather")
Package which is only available in source form, and may need compilation of C/C++/Fortran:featherThese will not be installed

The version of R I'm using is:
R version 3.2.5 (2016-04-14) -- "Very, Very Secure Dishes"
Copyright (C) 2016 The R Foundation for Statistical Computing
Platform: x86_64-w64-mingw32/x64 (64-bit)

Thanks!

feature request: tidyverse_load()

I would really appreciate a function like this:

#' Load all tidyverse packages.
#'
#' Load all tidyverse packages, separated by type.
#'
#' @param vector loads stringr, forcats, hms and lubridate.
#' @param model loads broom and modelr.
#' @param import loads DBI, haven, httr, jsonlite, readxl, rvest and xml2.
#'
#' @export
tidyverse_load <- function(vector = c('stringr', 'forcats', 'hms', 'lubridate'),
                           model = c('broom', 'modelr'),
                           import = c('DBI', 'haven', 'httr', 'jsonlite',
                                      'readxl', 'rvest', 'xml2')) {
  pkgs <- c(vector, model, import)
  vapply(pkgs, library, character.only = TRUE, logical.return = TRUE, logical(1))
  invisible()
}

I didn't make a PR because i think it needs some improvements (invisible loading, better documentation etc). Any thoughts?

Depends vs Imports in DESCRIPTION

Why isn't tidyverse declaring "Depends" and "Imports" in its DESCRIPTION in the typical way as of

The main difference is that where Imports just loads the package, Depends attaches it.
Source

Currently in tidyverse nothing is tagged as "Depends" even if it attaches 8 packages to the global namespace:

library(tools)
package_dependencies("tidyverse", which="Imports")
package_dependencies("tidyverse", which="Depends")

require(tidyverse)
sessionInfo()
> ...
> other attached packages:
> [1] magrittr_1.5     stringr_1.1.0    dplyr_0.5.0      purrr_0.2.2.9000
> [5] readr_1.0.0      tidyr_0.6.1      tibble_1.2       ggplot2_2.2.1
> [9] tidyverse_1.1.1
> ...

I'm not really a packaging expert, but I'd somehow expect all those packages (except no9 for sure) to show up under "Depends" in the DESCRIPTION.

BMI calculation on dplyr website

Body mass index is calculated using height in meters. Starwars dataset has height in cm.

starwars %>% 
  mutate(name, bmi = mass / (height/100) ^ 2) %>%
  select(name:mass, bmi)

Recommendations for tests

It would be interesting to formalize certain cross-package consistency expectations into tests that run every day or week.

Example: For some challenging csv's make sure readr and readxl (csv -> xls(x) -> df) produce same data frame.

These tests might be a useful complement to the ingest conventions (#34). I think this package would be the natural home for this? Although maybe you wouldn't want tidyverse to show build failing whenever these one of these tests fails.

Problem in DESCRIPTION

Suggests: Suggests:
in DESCRIPTION is an invalid line, and therefore installation does not work

SDMX

Given how amazing tidyverse is and how xml2 is so much better, how hard would it be to include teh capability of processing SDMX-ML within tidyverse? Statistics Canada is using the Statistical Data and Metadata Exchange (SDMX) framework to release multidimensional data and I am looking for a simpler way to process that data.

There is the package RSDMX but I really love the logic and syntax throughout tidyverse.

Would this be possible?

Big Endian stops feather, which stops tidyverse

Can't install tidyverse on the server due to Big Endian-ness:

Is there a way to install tidyverse without the feather dependency?

* installing *source* package ‘feather’ ...
** package ‘feather’ successfully unpacked and MD5 sums checked
Platform is big endian. This is currently unsupported.
ERROR: configuration failed for package ‘feather’
* removing **********/packrat/lib/x86_64-pc-linux-gnu/3.3.2/feather’
ERROR: dependency ‘feather’ is not available for package ‘tidyverse’
* removing ‘**********/packrat/lib/x86_64-pc-linux-gnu/3.3.2/tidyverse’

The downloaded source packages are in
	‘/tmp/Rtmpi2llVt/downloaded_packages’

parse_number

Is there a way to have

parse_number("-3.00000000E-3")

resolve to -0.003 rather than -3?
Thanks so much.

See all packages

Would it be possible to include a simple function that shows the user all the packages in the tidyverse package? There's no quick way to see it in the docs, and as I assume the package will be evolving, I think it would be handy to have a function like this for users to see what packages they can load.

Error running tidyverse::tidyverse_conflicts() without running library(tidyverse) before

When I run

tidyverse::tidyverse_conflicts()

I get this error (from purrr::map2)

Error: .x is not a vector (NULL)

Adding this line of code resolves the issue

if (is.null(tidy_funs)) tidy_funs <- purrr::set_names(list(), character(0))

Obs: Session info:

Expand
> devtools::session_info()
Session info ----------------------------------------------------------------------------------
 setting  value                       
 version  R version 3.3.2 (2016-10-31)
 system   x86_64, linux-gnu           
 ui       RStudio (1.0.136)           
 language en_US                       
 collate  en_US.UTF-8                 
 tz       America/Sao_Paulo           
 date     2017-03-06                  

Packages --------------------------------------------------------------------------------------
 package  * version date       source        
 devtools   1.12.0  2016-12-05 CRAN (R 3.3.2)
 digest     0.6.12  2017-01-27 cran (@0.6.12)
 memoise    1.0.0   2016-01-29 CRAN (R 3.3.2)
 withr      1.0.2   2016-06-20 CRAN (R 3.3.2)
> tidyverse::tidyverse_conflicts()
Error: `.x` is not a vector (NULL)

And, after running tidyverse::tidyverse_conflicts():

> devtools::session_info()
Session info ----------------------------------------------------------------------------------
 setting  value                       
 version  R version 3.3.2 (2016-10-31)
 system   x86_64, linux-gnu           
 ui       RStudio (1.0.136)           
 language en_US                       
 collate  en_US.UTF-8                 
 tz       America/Sao_Paulo           
 date     2017-03-06                  

Packages --------------------------------------------------------------------------------------
 package    * version    date       source                              
 assertthat   0.1        2013-12-06 cran (@0.1)                         
 broom        0.4.2      2017-02-13 CRAN (R 3.3.2)                      
 colorspace   1.3-2      2016-12-14 CRAN (R 3.3.2)                      
 DBI          0.5-1      2016-09-10 cran (@0.5-1)                       
 devtools     1.12.0     2016-12-05 CRAN (R 3.3.2)                      
 digest       0.6.12     2017-01-27 cran (@0.6.12)                      
 dplyr        0.5.0      2016-06-24 cran (@0.5.0)                       
 forcats      0.2.0      2017-01-23 cran (@0.2.0)                       
 foreign      0.8-67     2016-09-13 CRAN (R 3.3.1)                      
 ggplot2      2.2.1.9000 2017-03-01 Github (tidyverse/ggplot2@fa8004e)  
 gtable       0.2.0      2016-02-26 cran (@0.2.0)                       
 haven        1.0.0      2016-09-23 cran (@1.0.0)                       
 hms          0.3        2016-11-22 cran (@0.3)                         
 httr         1.2.1      2016-07-03 CRAN (R 3.3.2)                      
 jsonlite     1.3        2017-02-28 cran (@1.3)                         
 lattice      0.20-34    2016-09-06 CRAN (R 3.3.1)                      
 lazyeval     0.2.0      2016-06-12 cran (@0.2.0)                       
 lubridate    1.6.0      2016-09-13 cran (@1.6.0)                       
 magrittr     1.5        2014-11-22 cran (@1.5)                         
 memoise      1.0.0      2016-01-29 CRAN (R 3.3.2)                      
 mnormt       1.5-5      2016-10-15 cran (@1.5-5)                       
 modelr       0.1.0      2016-08-31 cran (@0.1.0)                       
 munsell      0.4.3      2016-02-13 CRAN (R 3.3.2)                      
 nlme         3.1-131    2017-02-06 CRAN (R 3.3.2)                      
 plyr         1.8.4      2016-06-08 cran (@1.8.4)                       
 psych        1.6.12     2017-01-08 cran (@1.6.12)                      
 purrr        0.2.2      2016-06-18 CRAN (R 3.3.2)                      
 R6           2.2.0      2016-10-05 CRAN (R 3.3.2)                      
 Rcpp         0.12.9.2   2017-02-09 Github (RcppCore/Rcpp@d38a304)      
 readr        1.0.0      2016-08-03 cran (@1.0.0)                       
 readxl       0.1.1      2016-03-28 cran (@0.1.1)                       
 reshape2     1.4.2      2016-10-22 cran (@1.4.2)                       
 rstudioapi   0.6        2016-06-27 CRAN (R 3.3.2)                      
 rvest        0.3.2      2016-06-17 cran (@0.3.2)                       
 scales       0.4.1      2016-11-09 cran (@0.4.1)                       
 stringi      1.1.2      2016-10-01 cran (@1.1.2)                       
 stringr      1.2.0      2017-02-18 cran (@1.2.0)                       
 tibble       1.2        2016-08-26 cran (@1.2)                         
 tidyr        0.6.1      2017-01-10 cran (@0.6.1)                       
 tidyverse    1.1.1.9000 2017-03-07 Github (tidyverse/tidyverse@2771fd7)
 withr        1.0.2      2016-06-20 CRAN (R 3.3.2)                      
 xml2         1.1.1      2017-01-24 cran (@1.1.1)

tidyverse Error in date_names_lang(date_names) cannot open file sysdata.rdb No such file or directory

Issue

I’m getting the following error attempting to use the read_csv from tidyverse:

Error in date_names_lang(date_names) :
cannot open file '~/R/x86_64-pc-linux-gnu-library/3.3/readr/R/sysdata.rdb': No such file or directory

Steps to Reproduce

  1. Load tidyverse
    library("tidyverse", lib.loc="~/R/x86_64-pc-linux-gnu-library/3.3")
  2. Run read_csv command
    raw <- read_csv("https://data.ny.gov/api/views/q6ts-kwhk/rows.csv?accessType=DOWNLOAD")
  3. Result

Error in date_names_lang(date_names) :
cannot open file '~/R/x86_64-pc-linux-gnu-library/3.3/readr/R/sysdata.rdb': No such file or directory

Steps Taken to Analyze Issue

  1. Terminate R Session
  2. Load readr
    library("readr", lib.loc="~/R/x86_64-pc-linux-gnu-library/3.3")
  3. Run read_csv command
    raw <- read_csv("https://data.ny.gov/api/views/q6ts-kwhk/rows.csv?accessType=DOWNLOAD")
  4. Result

Parsed with column specification:
cols(
Year = col_integer(),
Incident Date = col_character(),
Incident Type = col_character(),
Track = col_character(),
Inv Location = col_character(),
Racing Type Description = col_character(),
Division = col_character(),
Weather Conditions = col_character(),
Horse = col_character(),
Trainer = col_character(),
Jockey Driver = col_character(),
Incident Description = col_character(),
Death or Injury = col_character()
)

  1. Terminate R Session
  2. Load readr
    library("readr", lib.loc="~/R/x86_64-pc-linux-gnu-library/3.3")
  3. Load tidyverse
    library("tidyverse", lib.loc="~/R/x86_64-pc-linux-gnu-library/3.3")
  4. Run read_csv command
    raw <- read_csv("https://data.ny.gov/api/views/q6ts-kwhk/rows.csv?accessType=DOWNLOAD")
  5. Result

Parsed with column specification:
cols(
Year = col_integer(),
Incident Date = col_character(),
Incident Type = col_character(),
Track = col_character(),
Inv Location = col_character(),
Racing Type Description = col_character(),
Division = col_character(),
Weather Conditions = col_character(),
Horse = col_character(),
Trainer = col_character(),
Jockey Driver = col_character(),
Incident Description = col_character(),
Death or Injury = col_character()
)

Steps Taken to Attempt Resolution

  1. Remove readr package
    remove.packages("readr", lib="~/R/x86_64-pc-linux-gnu-library/3.3")
  2. Install readr package
    install.packages("readr")
  3. Remove tidyverse package
    remove.packages("tidyverse", lib="~/R/x86_64-pc-linux-gnu-library/3.3")
  4. Install tidyverse package
    install.packages("tidyverse")

Session Info

devtools::session_info()

Session info -------------------------------------------------------------------------------------
setting value
version R version 3.3.3 (2017-03-06)
system x86_64, linux-gnu
ui RStudio (1.0.136)
language (EN)
collate en_US.UTF-8
tz America/New_York
date 2017-03-07

Packages -----------------------------------------------------------------------------------------
package * version date source
assertthat 0.1 2013-12-06 CRAN (R 3.3.2)
broom 0.4.2 2017-02-13 CRAN (R 3.3.2)
colorspace 1.3-2 2016-12-14 CRAN (R 3.3.2)
curl 2.3 2016-11-24 CRAN (R 3.3.2)
DBI 0.5-1 2016-09-10 CRAN (R 3.3.2)
devtools 1.12.0 2016-12-05 CRAN (R 3.3.3)
digest 0.6.12 2017-01-27 CRAN (R 3.3.2)
dplyr * 0.5.0 2016-06-24 CRAN (R 3.3.2)
forcats 0.2.0 2017-01-23 CRAN (R 3.3.2)
foreign 0.8-67 2016-09-13 CRAN (R 3.3.1)
ggplot2 * 2.2.1 2016-12-30 CRAN (R 3.3.2)
gtable 0.2.0 2016-02-26 CRAN (R 3.3.2)
haven 1.0.0 2016-09-23 CRAN (R 3.3.2)
hms 0.3 2016-11-22 CRAN (R 3.3.2)
httr 1.2.1 2016-07-03 CRAN (R 3.3.2)
jsonlite 1.3 2017-02-28 CRAN (R 3.3.2)
lattice 0.20-34 2016-09-06 CRAN (R 3.3.1)
lazyeval 0.2.0 2016-06-12 CRAN (R 3.3.2)
lubridate 1.6.0 2016-09-13 CRAN (R 3.3.2)
magrittr 1.5 2014-11-22 CRAN (R 3.3.2)
memoise 1.0.0 2016-01-29 CRAN (R 3.3.3)
mnormt 1.5-5 2016-10-15 CRAN (R 3.3.2)
modelr 0.1.0 2016-08-31 CRAN (R 3.3.2)
munsell 0.4.3 2016-02-13 CRAN (R 3.3.2)
nlme 3.1-131 2017-02-06 CRAN (R 3.3.2)
plyr 1.8.4 2016-06-08 CRAN (R 3.3.2)
psych 1.6.12 2017-01-08 CRAN (R 3.3.2)
purrr * 0.2.2 2016-06-18 CRAN (R 3.3.2)
R6 2.2.0 2016-10-05 CRAN (R 3.3.2)
Rcpp 0.12.9 2017-01-14 CRAN (R 3.3.2)
readr * 1.0.0 2016-08-03 CRAN (R 3.3.3)
readxl 0.1.1 2016-03-28 CRAN (R 3.3.2)
reshape2 1.4.2 2016-10-22 CRAN (R 3.3.2)
rvest 0.3.2 2016-06-17 CRAN (R 3.3.2)
scales 0.4.1 2016-11-09 CRAN (R 3.3.2)
stringi 1.1.2 2016-10-01 CRAN (R 3.3.2)
stringr 1.2.0 2017-02-18 CRAN (R 3.3.2)
tibble * 1.2 2016-08-26 CRAN (R 3.3.2)
tidyr * 0.6.1 2017-01-10 CRAN (R 3.3.2)
tidyverse * 1.1.1 2017-01-27 CRAN (R 3.3.2)
withr 1.0.2 2016-06-20 CRAN (R 3.3.3)
xml2 1.1.1 2017-01-24 CRAN (R 3.3.2)

RNG seed is not preserved when loading tidyverse

It seems that loading the tidyverse package calls a random number or otherwise does not preserve a call to set.seed(). I ran into this issue when working on my unit tests. Below is an MRE and my session info before and after loading the package.

> sessionInfo()
R version 3.2.3 (2015-12-10)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows 7 x64 (build 7601) Service Pack 1

locale:
[1] LC_COLLATE=English_United States.1252 
[2] LC_CTYPE=English_United States.1252   
[3] LC_MONETARY=English_United States.1252
[4] LC_NUMERIC=C                          
[5] LC_TIME=English_United States.1252    

attached base packages:
[1] stats     graphics  grDevices utils    
[5] datasets  methods   base     

loaded via a namespace (and not attached):
[1] tools_3.2.3
> 
> #initial draw
> set.seed(12345)
> x0 <- rnorm(1)
> x0
[1] 0.5855288
> 
> #second draw - should work
> set.seed(12345)
> x1 <- rnorm(1)
> x1
[1] 0.5855288
> 
> x0==x1 ##passes
[1] TRUE
> 
> 
> #draw after loading tidyverse
> set.seed(12345)
> library(tidyverse)
Loading tidyverse: ggplot2
Loading tidyverse: tibble
Loading tidyverse: tidyr
Loading tidyverse: readr
Loading tidyverse: purrr
Loading tidyverse: dplyr
Conflicts with tidy packages ----------------------
filter(): dplyr, stats
lag():    dplyr, stats
Warning messages:
1: package ‘tidyverse’ was built under R version 3.2.5 
2: package ‘ggplot2’ was built under R version 3.2.5 
3: package ‘tibble’ was built under R version 3.2.5 
4: package ‘tidyr’ was built under R version 3.2.5 
5: package ‘purrr’ was built under R version 3.2.5 
6: package ‘dplyr’ was built under R version 3.2.5 
> x2 <- rnorm(1)
> x2
[1] 1.154114
> 
> x0==x2 ##fails
[1] FALSE
> 
> #post-tidyverse
> sessionInfo()
R version 3.2.3 (2015-12-10)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows 7 x64 (build 7601) Service Pack 1

locale:
[1] LC_COLLATE=English_United States.1252 
[2] LC_CTYPE=English_United States.1252   
[3] LC_MONETARY=English_United States.1252
[4] LC_NUMERIC=C                          
[5] LC_TIME=English_United States.1252    

attached base packages:
[1] stats     graphics  grDevices utils    
[5] datasets  methods   base     

other attached packages:
[1] dplyr_0.5.0     purrr_0.2.2     readr_0.1.1    
[4] tidyr_0.6.0     tibble_1.2      ggplot2_2.2.0  
[7] tidyverse_1.0.0

loaded via a namespace (and not attached):
 [1] Rcpp_0.12.7      assertthat_0.1  
 [3] R6_2.1.0         grid_3.2.3      
 [5] plyr_1.8.4       DBI_0.5-1       
 [7] gtable_0.1.2     magrittr_1.5    
 [9] scales_0.4.1     lazyeval_0.2.0  
[11] tools_3.2.3      munsell_0.4.2   
[13] colorspace_1.2-6

I also tested this same code but with either dplyr, tidyr, or tibble loaded individually, and these three runs passed successfully.

Better printing on load

Loading tidyverse ------\  Session info ----------\
* ggplot2 2.2.1         |  Date:  2017-04-13
* tibble  1.3.0         |  R:     3.3.2
* tidyr   0.6.1         |  OS:    macOS Sierra 10.12.4
* readr   1.1.0         |  TZ:    America/Chicago 
* purrr   0.2.2.9000    |  Lang:  EN - en_US.UTF-8
* dplyr   0.5.0         |  

add working build settings for travis with packrat + tidyverse

I'm using the standard packrat settings for Travis (container based infrastructure), and I've run into some build problems stemming from tidyverse dependencies:

  • this for readxl,
  • and this for feather.

Both are related to C/C++ compiler dependencies if I understand the problem correctly.
I'm not sure whether they are related.

I thought I'd post this here because the packrat + tidyverse + Travis toolchain is perhaps commonly used.

I was also wondering whether it would be possible to publish/recommend a .travis.yml that we can rely on to work with the current version of tidyverse dependencies.

Figuring out these dependencies one-by-one is quite cumbersome for people not versed in compiler stuff (like myself), and this might (perhaps?) help strengthen (technical) reproducibility around the tidyverse toolchain, if it comes with one build environment.

Ps.: does this problem arise only when packrat is used, or are non-packrat setups used as well?

Recommend Projects

  • React photo React

    A declarative, efficient, and flexible JavaScript library for building user interfaces.

  • Vue.js photo Vue.js

    🖖 Vue.js is a progressive, incrementally-adoptable JavaScript framework for building UI on the web.

  • Typescript photo Typescript

    TypeScript is a superset of JavaScript that compiles to clean JavaScript output.

  • TensorFlow photo TensorFlow

    An Open Source Machine Learning Framework for Everyone

  • Django photo Django

    The Web framework for perfectionists with deadlines.

  • D3 photo D3

    Bring data to life with SVG, Canvas and HTML. 📊📈🎉

Recommend Topics

  • javascript

    JavaScript (JS) is a lightweight interpreted programming language with first-class functions.

  • web

    Some thing interesting about web. New door for the world.

  • server

    A server is a program made to process requests and deliver data to clients.

  • Machine learning

    Machine learning is a way of modeling and interpreting data that allows a piece of software to respond intelligently.

  • Game

    Some thing interesting about game, make everyone happy.

Recommend Org

  • Facebook photo Facebook

    We are working to build community through open source technology. NB: members must have two-factor auth.

  • Microsoft photo Microsoft

    Open source projects and samples from Microsoft.

  • Google photo Google

    Google ❤️ Open Source for everyone.

  • D3 photo D3

    Data-Driven Documents codes.