diff --git a/.Rbuildignore b/.Rbuildignore
index 36da0fa..0dd210b 100644
--- a/.Rbuildignore
+++ b/.Rbuildignore
@@ -9,3 +9,4 @@
^\.Rprofile$
^packrat/
^to-cor-df\.png$
+revdep
\ No newline at end of file
diff --git a/.travis.yml b/.travis.yml
index 8b0824a..e4f23c0 100644
--- a/.travis.yml
+++ b/.travis.yml
@@ -4,8 +4,7 @@ language: R
sudo: false
cache: packages
-r_github_packages:
- - jimhester/covr
-
-after_success:
- - Rscript -e 'covr::codecov()'
\ No newline at end of file
+include:
+ - r: release
+ - r: oldrel
+ - r: devel
diff --git a/DESCRIPTION b/DESCRIPTION
index 892c28a..0adf5ca 100644
--- a/DESCRIPTION
+++ b/DESCRIPTION
@@ -1,6 +1,6 @@
Package: corrr
Type: Package
-Version: 0.2.1.9000
+Version: 0.3.0
Title: Correlations in R
Description: A tool for exploring correlations.
It makes it possible to easily perform routine tasks when
@@ -16,8 +16,7 @@ Authors@R: c(
URL: https://github.com/drsimonj/corrr
BugReports: https://github.com/drsimonj/corrr/issues
Depends:
- R (>= 3.3.0),
- dplyr (>= 0.5.0)
+ R (>= 3.3.0)
LazyData: yes
License: MIT + file LICENSE
RoxygenNote: 6.0.1
@@ -29,6 +28,7 @@ Suggests:
DBI,
RSQLite
Imports:
+ dplyr (>= 0.5.0),
magrittr (>= 1.5),
tidyr (>= 0.5.1),
ggplot2 (>= 2.2.0),
diff --git a/NEWS.md b/NEWS.md
index 69fb2a7..cc710b8 100644
--- a/NEWS.md
+++ b/NEWS.md
@@ -1,4 +1,4 @@
-# corrr 0.2.1.9000
+# corrr 0.3.0
## Small breaking changes
@@ -28,6 +28,8 @@ The `diagonal` argument of `as_matrix` and `as_matrix.cor_df` is now an optional
- During the development of this version, ggplot v2.2.0 was released. Many changes in the plotting functions have been made to handle new features in the updated version of ggplot2.
+- Improvements to the package folder structure
+
# corrr 0.2.1
## New Functionality
diff --git a/R/output.R b/R/output.R
index 10db122..f9e2948 100644
--- a/R/output.R
+++ b/R/output.R
@@ -12,6 +12,7 @@
#' @export
#' @examples
#' # Examples with correlate()
+#' library(dplyr)
#' mtcars %>% correlate() %>% fashion()
#' mtcars %>% correlate() %>% fashion(decimals = 1)
#' mtcars %>% correlate() %>% fashion(leading_zeros = TRUE)
diff --git a/R/reshape.R b/R/reshape.R
index 6988e7c..7c6e84a 100644
--- a/R/reshape.R
+++ b/R/reshape.R
@@ -16,6 +16,7 @@
#' @return A tbl or, if mirror = TRUE, a cor_df (see \code{\link{correlate}}).
#' @export
#' @examples
+#' library(dplyr)
#' x <- correlate(mtcars)
#' focus(x, mpg, cyl) # Focus on correlations of mpg and cyl with all other variables
#' focus(x, -disp, - mpg, mirror = TRUE) # Remove disp and mpg from columns and rows
@@ -48,6 +49,7 @@ focus_ <- function(x, ..., .dots, mirror) {
#' @return A tibble or, if mirror = TRUE, a correlation data frame.
#' @export
#' @examples
+#' library(dplyr)
#' any_greater_than <- function(x, val) {
#' mean(abs(x), na.rm = TRUE) > val
#' }
diff --git a/README-combination-1.png b/README-combination-1.png
deleted file mode 100644
index 6d2b2a2..0000000
Binary files a/README-combination-1.png and /dev/null differ
diff --git a/README-combination-2.png b/README-combination-2.png
deleted file mode 100644
index 8a283ff..0000000
Binary files a/README-combination-2.png and /dev/null differ
diff --git a/README.Rmd b/README.Rmd
index ae03c0c..e14da00 100644
--- a/README.Rmd
+++ b/README.Rmd
@@ -8,7 +8,7 @@ output: github_document
knitr::opts_chunk$set(
collapse = TRUE,
comment = "#>",
- fig.path = "README-"
+ fig.path = "tools/readme/"
)
```
@@ -24,7 +24,7 @@ knitr::opts_chunk$set(
corrr is a package for exploring **corr**elations in **R**. It focuses on creating and working with **data frames** of correlations (instead of matrices) that can be easily explored via corrr functions or by leveraging tools like those in the [tidyverse](http://tidyverse.org/). This, along with the primary corrr functions, is represented below:
-
+
You can install:
diff --git a/README.md b/README.md
index bf1dc63..7049d5d 100644
--- a/README.md
+++ b/README.md
@@ -1,59 +1,85 @@
+
# corrr
-[![Project Status: Active ? The project has reached a stable, usable state and is being actively developed.](http://www.repostatus.org/badges/latest/active.svg)](http://www.repostatus.org/#active) [![minimal R version](https://img.shields.io/badge/R%3E%3D-3.3.0-6666ff.svg)](https://cran.r-project.org/) [![CRAN\_Status\_Badge](http://www.r-pkg.org/badges/version/corrr)](https://cran.r-project.org/package=corrr) [![packageversion](https://img.shields.io/badge/Package%20version-0.2.1.9000-orange.svg?style=flat-square)](commits/master) [![Last-changedate](https://img.shields.io/badge/last%20change-2017--02--03-yellowgreen.svg)](/commits/master) [![Build Status](https://travis-ci.org/drsimonj/corrr.svg?branch=master)](https://travis-ci.org/drsimonj/corrr) [![Downloads](http://cranlogs.r-pkg.org/badges/grand-total/corrr)](http://cran.rstudio.com/web/packages/corrr/index.html)
-
-corrr is a package for exploring **corr**elations in **R**. It focuses on creating and working with **data frames** of correlations (instead of matrices) that can be easily explored via corrr functions or by leveraging tools like those in the [tidyverse](http://tidyverse.org/). This, along with the primary corrr functions, is represented below:
-
-
+[![Project Status: Active ? The project has reached a stable, usable
+state and is being actively
+developed.](http://www.repostatus.org/badges/latest/active.svg)](http://www.repostatus.org/#active)
+[![minimal R
+version](https://img.shields.io/badge/R%3E%3D-3.3.0-6666ff.svg)](https://cran.r-project.org/)
+[![CRAN\_Status\_Badge](http://www.r-pkg.org/badges/version/corrr)](https://cran.r-project.org/package=corrr)
+[![packageversion](https://img.shields.io/badge/Package%20version-0.2.1.9000-orange.svg?style=flat-square)](commits/master)
+[![Last-changedate](https://img.shields.io/badge/last%20change-2018--05--28-yellowgreen.svg)](/commits/master)
+[![Build
+Status](https://travis-ci.org/drsimonj/corrr.svg?branch=master)](https://travis-ci.org/drsimonj/corrr)
+[![Downloads](http://cranlogs.r-pkg.org/badges/grand-total/corrr)](http://cran.rstudio.com/web/packages/corrr/index.html)
+
+corrr is a package for exploring **corr**elations in **R**. It focuses
+on creating and working with **data frames** of correlations (instead of
+matrices) that can be easily explored via corrr functions or by
+leveraging tools like those in the [tidyverse](http://tidyverse.org/).
+This, along with the primary corrr functions, is represented below:
+
+
You can install:
-- the latest released version from CRAN with
+ - the latest released version from CRAN with
+
+
``` r
install.packages("corrr")
```
-- the latest development version from github with
+ - the latest development version from github
+with
+
+
``` r
install.packages("devtools") # run this line if devtools is not installed
devtools::install_github("drsimonj/corrr")
```
-Using corrr
------------
+## Using corrr
-Using `corrr` typically starts with `correlate()`, which acts like the base correlation function `cor()`. It differs by defaulting to pairwise deletion, and returning a correlation data frame (`cor_df`) of the following structure:
+Using `corrr` typically starts with `correlate()`, which acts like the
+base correlation function `cor()`. It differs by defaulting to pairwise
+deletion, and returning a correlation data frame (`cor_df`) of the
+following structure:
-- A `tbl` with an additional class, `cor_df`
-- An extra "rowname" column
-- Standardised variances (the matrix diagonal) set to missing values (`NA`) so they can be ignored.
+ - A `tbl` with an additional class, `cor_df`
+ - An extra “rowname” column
+ - Standardised variances (the matrix diagonal) set to missing values
+ (`NA`) so they can be ignored.
### API
-The corrr API is designed with data pipelines in mind (e.g., to use `%>%` from the magrittr package). After `correlate()`, the primary corrr functions take a `cor_df` as their first argument, and return a `cor_df` or `tbl` (or output like a plot). These functions serve one of three purposes:
+The corrr API is designed with data pipelines in mind (e.g., to use
+`%>%` from the magrittr package). After `correlate()`, the primary corrr
+functions take a `cor_df` as their first argument, and return a `cor_df`
+or `tbl` (or output like a plot). These functions serve one of three
+purposes:
Internal changes (`cor_df` out):
-- `shave()` the upper or lower triangle (set to NA).
-- `rearrange()` the columns and rows based on correlation strengths.
+ - `shave()` the upper or lower triangle (set to NA).
+ - `rearrange()` the columns and rows based on correlation strengths.
Reshape structure (`tbl` or `cor_df` out):
-- `focus()` on select columns and rows.
-- `stretch()` into a long format.
+ - `focus()` on select columns and rows.
+ - `stretch()` into a long format.
Output/visualisations (console/plot out):
-- `fashion()` the correlations for pretty printing.
-- `rplot()` the correlations with shapes in place of the values.
-- `network_plot()` the correlations in a network.
+ - `fashion()` the correlations for pretty printing.
+ - `rplot()` the correlations with shapes in place of the values.
+ - `network_plot()` the correlations in a network.
-Examples
---------
+## Examples
``` r
library(MASS)
@@ -83,31 +109,30 @@ x <- correlate(d)
class(x)
#> [1] "cor_df" "tbl_df" "tbl" "data.frame"
x
-#> # A tibble: 6 × 7
-#> rowname v1 v2 v3 v4 v5
-#>
-#> 1 v1 NA 0.70986371 0.709330652 0.0001947192 0.021359764
-#> 2 v2 0.7098637068 NA 0.697411266 -0.0132575510 0.009280530
-#> 3 v3 0.7093306516 0.69741127 NA -0.0252752456 0.001088652
-#> 4 v4 0.0001947192 -0.01325755 -0.025275246 NA 0.421380212
-#> 5 v5 0.0213597639 0.00928053 0.001088652 0.4213802123 NA
-#> 6 v6 -0.0435135083 -0.03383145 -0.020057495 0.4424697437 0.425441795
-#> # ... with 1 more variables: v6
+#> # A tibble: 6 x 7
+#> rowname v1 v2 v3 v4 v5 v6
+#>
+#> 1 v1 NA 0.710 0.709 0.000195 0.0214 -0.0435
+#> 2 v2 0.710 NA 0.697 -0.0133 0.00928 -0.0338
+#> 3 v3 0.709 0.697 NA -0.0253 0.00109 -0.0201
+#> 4 v4 0.000195 -0.0133 -0.0253 NA 0.421 0.442
+#> 5 v5 0.0214 0.00928 0.00109 0.421 NA 0.425
+#> 6 v6 -0.0435 -0.0338 -0.0201 0.442 0.425 NA
```
-As a `tbl`, we can use functions from data frame packages like `dplyr`, `tidyr`, `ggplot2`:
+As a `tbl`, we can use functions from data frame packages like `dplyr`,
+`tidyr`, `ggplot2`:
``` r
library(dplyr)
# Filter rows by correlation size
x %>% filter(v1 > .6)
-#> # A tibble: 2 × 7
-#> rowname v1 v2 v3 v4 v5
-#>
-#> 1 v2 0.7098637 NA 0.6974113 -0.01325755 0.009280530
-#> 2 v3 0.7093307 0.6974113 NA -0.02527525 0.001088652
-#> # ... with 1 more variables: v6
+#> # A tibble: 2 x 7
+#> rowname v1 v2 v3 v4 v5 v6
+#>
+#> 1 v2 0.710 NA 0.697 -0.0133 0.00928 -0.0338
+#> 2 v3 0.709 0.697 NA -0.0253 0.00109 -0.0201
```
corrr functions work in pipelines (`cor_df` in; `cor_df` or `tbl` out):
@@ -136,7 +161,7 @@ fashion(x)
rplot(x)
```
-![](README-combination-1.png)
+![](tools/readme/combination-1.png)
``` r
@@ -148,4 +173,4 @@ datasets::airquality %>%
#> Missing treated using: 'pairwise.complete.obs'
```
-![](README-combination-2.png)
+![](tools/readme/combination-2.png)
diff --git a/README_files/figure-markdown_github/combination-1.png b/README_files/figure-markdown_github/combination-1.png
deleted file mode 100644
index f5ebab8..0000000
Binary files a/README_files/figure-markdown_github/combination-1.png and /dev/null differ
diff --git a/README_files/figure-markdown_github/rplot-1.png b/README_files/figure-markdown_github/rplot-1.png
deleted file mode 100644
index dc64868..0000000
Binary files a/README_files/figure-markdown_github/rplot-1.png and /dev/null differ
diff --git a/README_files/figure-markdown_github/rplot_arranged-1.png b/README_files/figure-markdown_github/rplot_arranged-1.png
deleted file mode 100644
index 977b29e..0000000
Binary files a/README_files/figure-markdown_github/rplot_arranged-1.png and /dev/null differ
diff --git a/README_files/figure-markdown_github/rplot_arranged-2.png b/README_files/figure-markdown_github/rplot_arranged-2.png
deleted file mode 100644
index 1843d71..0000000
Binary files a/README_files/figure-markdown_github/rplot_arranged-2.png and /dev/null differ
diff --git a/README_files/figure-markdown_github/rplot_arranged-3.png b/README_files/figure-markdown_github/rplot_arranged-3.png
deleted file mode 100644
index 0d777e2..0000000
Binary files a/README_files/figure-markdown_github/rplot_arranged-3.png and /dev/null differ
diff --git a/README_files/figure-markdown_github/unnamed-chunk-3-1.png b/README_files/figure-markdown_github/unnamed-chunk-3-1.png
deleted file mode 100644
index 9d5bfc7..0000000
Binary files a/README_files/figure-markdown_github/unnamed-chunk-3-1.png and /dev/null differ
diff --git a/cran-comments.md b/cran-comments.md
index 75788bc..6446124 100644
--- a/cran-comments.md
+++ b/cran-comments.md
@@ -1,23 +1,26 @@
-## Test environments
-* local Windows 10 install, R 3.3.1
-* ubuntu 12.04.5 LTS (on travis-ci), R 3.3.1
-* win-builder (devel and release)
+## Release summary
-## R CMD check results
+- `as_cordf` will coerce lists or matrices into correlation data frames if possible
+
+- `focus_if` enables conditional variable selection
+
+- Can use arithmetic operators (e.g., `+` or `-`) with correlation data frames
+
+- `correlate()` now supports data frame with a SQL back-end (`tbl_sql`)
-Except for win-builder, there were no ERRORs, WARNINGs or NOTEs.
+- Small breaking change: The `diagonal` argument of `as_matrix` and `as_matrix.cor_df` is now an optional argument rather than set to `1` by default
-Via win-builder, there was 1 NOTE:
+- Other improvements and fixes
+
+## Test environments
+* local Windows 10 install, R 3.5.0
+* ubuntu 14.04 (on travis-ci)
+* Ubuntu 14.04.5 LTS with RStudio Server, R 3.4.3
+
+## R CMD check results
- * checking CRAN incoming feasibility ... NOTE
- Maintainer: 'Simon Jackson '
-
- License components with restrictions and base license permitting such:
- MIT + file LICENSE
- File 'LICENSE':
- YEAR: 2016
- COPYRIGHT HOLDER: Simon Jackson
+- 0 errors | 0 warnings | 0 notes
-## Downstream dependencies
+## revdep check results
-There are currently no downstream dependencies for this package.
\ No newline at end of file
+- 0 packages
\ No newline at end of file
diff --git a/man/fashion.Rd b/man/fashion.Rd
index ddad5dd..94849a7 100644
--- a/man/fashion.Rd
+++ b/man/fashion.Rd
@@ -25,6 +25,7 @@ for signs) and the diagonal (or any NA) left blank.
}
\examples{
# Examples with correlate()
+library(dplyr)
mtcars \%>\% correlate() \%>\% fashion()
mtcars \%>\% correlate() \%>\% fashion(decimals = 1)
mtcars \%>\% correlate() \%>\% fashion(leading_zeros = TRUE)
diff --git a/man/focus.Rd b/man/focus.Rd
index dbcdcdd..a63f9cb 100644
--- a/man/focus.Rd
+++ b/man/focus.Rd
@@ -45,6 +45,7 @@ rows based on `\code{same}. For a complete list of methods for using this
function, see \code{\link[dplyr]{select}}.
}
\examples{
+library(dplyr)
x <- correlate(mtcars)
focus(x, mpg, cyl) # Focus on correlations of mpg and cyl with all other variables
focus(x, -disp, - mpg, mirror = TRUE) # Remove disp and mpg from columns and rows
diff --git a/man/focus_if.Rd b/man/focus_if.Rd
index f9175db..bf8d7a3 100644
--- a/man/focus_if.Rd
+++ b/man/focus_if.Rd
@@ -27,6 +27,7 @@ Apply a predicate function to each colum of correlations. Columns that
evaluate to TRUE will be included in a call to \code{\link{focus}}.
}
\examples{
+library(dplyr)
any_greater_than <- function(x, val) {
mean(abs(x), na.rm = TRUE) > val
}
diff --git a/packrat/init.R b/packrat/init.R
deleted file mode 100644
index 29aaa44..0000000
--- a/packrat/init.R
+++ /dev/null
@@ -1,217 +0,0 @@
-local({
-
- ## Helper function to get the path to the library directory for a
- ## given packrat project.
- getPackratLibDir <- function(projDir = NULL) {
- path <- file.path("packrat", "lib", R.version$platform, getRversion())
-
- if (!is.null(projDir)) {
-
- ## Strip trailing slashes if necessary
- projDir <- sub("/+$", "", projDir)
-
- ## Only prepend path if different from current working dir
- if (!identical(normalizePath(projDir), normalizePath(getwd())))
- path <- file.path(projDir, path)
- }
-
- path
- }
-
- ## Ensure that we set the packrat library directory relative to the
- ## project directory. Normally, this should be the working directory,
- ## but we also use '.rs.getProjectDirectory()' if necessary (e.g. we're
- ## rebuilding a project while within a separate directory)
- libDir <- if (exists(".rs.getProjectDirectory"))
- getPackratLibDir(.rs.getProjectDirectory())
- else
- getPackratLibDir()
-
- ## Unload packrat in case it's loaded -- this ensures packrat _must_ be
- ## loaded from the private library. Note that `requireNamespace` will
- ## succeed if the package is already loaded, regardless of lib.loc!
- if ("packrat" %in% loadedNamespaces())
- try(unloadNamespace("packrat"), silent = TRUE)
-
- if (suppressWarnings(requireNamespace("packrat", quietly = TRUE, lib.loc = libDir))) {
-
- # Check 'print.banner.on.startup' -- when NA and RStudio, don't print
- print.banner <- packrat::get_opts("print.banner.on.startup")
- if (print.banner == "auto" && is.na(Sys.getenv("RSTUDIO", unset = NA))) {
- print.banner <- TRUE
- } else {
- print.banner <- FALSE
- }
- return(packrat::on(print.banner = print.banner))
- }
-
- ## Escape hatch to allow RStudio to handle bootstrapping. This
- ## enables RStudio to provide print output when automagically
- ## restoring a project from a bundle on load.
- if (!is.na(Sys.getenv("RSTUDIO", unset = NA)) &&
- is.na(Sys.getenv("RSTUDIO_PACKRAT_BOOTSTRAP", unset = NA))) {
- Sys.setenv("RSTUDIO_PACKRAT_BOOTSTRAP" = "1")
- setHook("rstudio.sessionInit", function(...) {
- # Ensure that, on sourcing 'packrat/init.R', we are
- # within the project root directory
- if (exists(".rs.getProjectDirectory")) {
- owd <- getwd()
- setwd(.rs.getProjectDirectory())
- on.exit(setwd(owd), add = TRUE)
- }
- source("packrat/init.R")
- })
- return(invisible(NULL))
- }
-
- ## Bootstrapping -- only performed in interactive contexts,
- ## or when explicitly asked for on the command line
- if (interactive() || "--bootstrap-packrat" %in% commandArgs(TRUE)) {
-
- message("Packrat is not installed in the local library -- ",
- "attempting to bootstrap an installation...")
-
- ## We need utils for the following to succeed -- there are calls to functions
- ## in 'restore' that are contained within utils. utils gets loaded at the
- ## end of start-up anyhow, so this should be fine
- library("utils", character.only = TRUE)
-
- ## Install packrat into local project library
- packratSrcPath <- list.files(full.names = TRUE,
- file.path("packrat", "src", "packrat")
- )
-
- ## No packrat tarballs available locally -- try some other means of installation
- if (!length(packratSrcPath)) {
-
- message("> No source tarball of packrat available locally")
-
- ## There are no packrat sources available -- try using a version of
- ## packrat installed in the user library to bootstrap
- if (requireNamespace("packrat", quietly = TRUE) && packageVersion("packrat") >= "0.2.0.99") {
- message("> Using user-library packrat (",
- packageVersion("packrat"),
- ") to bootstrap this project")
- }
-
- ## Couldn't find a user-local packrat -- try finding and using devtools
- ## to install
- else if (requireNamespace("devtools", quietly = TRUE)) {
- message("> Attempting to use devtools::install_github to install ",
- "a temporary version of packrat")
- library(stats) ## for setNames
- devtools::install_github("rstudio/packrat")
- }
-
- ## Try downloading packrat from CRAN if available
- else if ("packrat" %in% rownames(available.packages())) {
- message("> Installing packrat from CRAN")
- install.packages("packrat")
- }
-
- ## Fail -- couldn't find an appropriate means of installing packrat
- else {
- stop("Could not automatically bootstrap packrat -- try running ",
- "\"'install.packages('devtools'); devtools::install_github('rstudio/packrat')\"",
- "and restarting R to bootstrap packrat.")
- }
-
- # Restore the project, unload the temporary packrat, and load the private packrat
- packrat::restore(prompt = FALSE, restart = TRUE)
-
- ## This code path only reached if we didn't restart earlier
- unloadNamespace("packrat")
- requireNamespace("packrat", lib.loc = libDir, quietly = TRUE)
- return(packrat::on())
-
- }
-
- ## Multiple packrat tarballs available locally -- try to choose one
- ## TODO: read lock file and infer most appropriate from there; low priority because
- ## after bootstrapping packrat a restore should do the right thing
- if (length(packratSrcPath) > 1) {
- warning("Multiple versions of packrat available in the source directory;",
- "using packrat source:\n- ", shQuote(packratSrcPath))
- packratSrcPath <- packratSrcPath[[1]]
- }
-
-
- lib <- file.path("packrat", "lib", R.version$platform, getRversion())
- if (!file.exists(lib)) {
- dir.create(lib, recursive = TRUE)
- }
- lib <- normalizePath(lib, winslash = "/")
-
- message("> Installing packrat into project private library:")
- message("- ", shQuote(lib))
-
- surround <- function(x, with) {
- if (!length(x)) return(character())
- paste0(with, x, with)
- }
-
- ## The following is performed because a regular install.packages call can fail
- peq <- function(x, y) paste(x, y, sep = " = ")
- installArgs <- c(
- peq("pkgs", surround(packratSrcPath, with = "'")),
- peq("lib", surround(lib, with = "'")),
- peq("repos", "NULL"),
- peq("type", surround("source", with = "'"))
- )
- installCmd <- paste(sep = "",
- "utils::install.packages(",
- paste(installArgs, collapse = ", "),
- ")")
-
- fullCmd <- paste(
- surround(file.path(R.home("bin"), "R"), with = "\""),
- "--vanilla",
- "--slave",
- "-e",
- surround(installCmd, with = "\"")
- )
- system(fullCmd)
-
- ## Tag the installed packrat so we know it's managed by packrat
- ## TODO: should this be taking information from the lockfile? this is a bit awkward
- ## because we're taking an un-annotated packrat source tarball and simply assuming it's now
- ## an 'installed from source' version
-
- ## -- InstallAgent -- ##
- installAgent <- 'InstallAgent: packrat 0.4.7-1'
-
- ## -- InstallSource -- ##
- installSource <- 'InstallSource: source'
-
- packratDescPath <- file.path(lib, "packrat", "DESCRIPTION")
- DESCRIPTION <- readLines(packratDescPath)
- DESCRIPTION <- c(DESCRIPTION, installAgent, installSource)
- cat(DESCRIPTION, file = packratDescPath, sep = "\n")
-
- # Otherwise, continue on as normal
- message("> Attaching packrat")
- library("packrat", character.only = TRUE, lib.loc = lib)
-
- message("> Restoring library")
- restore(restart = FALSE)
-
- # If the environment allows us to restart, do so with a call to restore
- restart <- getOption("restart")
- if (!is.null(restart)) {
- message("> Packrat bootstrap successfully completed. ",
- "Restarting R and entering packrat mode...")
- return(restart())
- }
-
- # Callers (source-erers) can define this hidden variable to make sure we don't enter packrat mode
- # Primarily useful for testing
- if (!exists(".__DONT_ENTER_PACKRAT_MODE__.") && interactive()) {
- message("> Packrat bootstrap successfully completed. Entering packrat mode...")
- packrat::on()
- }
-
- Sys.unsetenv("RSTUDIO_PACKRAT_BOOTSTRAP")
-
- }
-
-})
diff --git a/packrat/packrat.lock b/packrat/packrat.lock
deleted file mode 100644
index 5364b99..0000000
--- a/packrat/packrat.lock
+++ /dev/null
@@ -1,437 +0,0 @@
-PackratFormat: 1.4
-PackratVersion: 0.4.7.1
-RVersion: 3.3.1
-Repos: CRAN=https://cran.rstudio.com/,
- CRANextra=http://www.stats.ox.ac.uk/pub/RWin
-
-Package: BH
-Source: CRAN
-Version: 1.60.0-2
-Hash: be2967bcff307e561d9ba17faf03205c
-
-Package: DBI
-Source: CRAN
-Version: 0.5-1
-Hash: 375869004db963f9915f2b8a49b4a718
-
-Package: DEoptimR
-Source: CRAN
-Version: 1.0-6
-Hash: 0d74e13bdb47749dc511cee60e1a167e
-
-Package: R6
-Source: CRAN
-Version: 2.1.3
-Hash: 1a8313c9df76d2a06aa27c13a4a71c73
-
-Package: RColorBrewer
-Source: CRAN
-Version: 1.1-2
-Hash: c0d56cd15034f395874c870141870c25
-
-Package: Rcpp
-Source: CRAN
-Version: 0.12.7
-Hash: f0ba7322cfb66f1b563462faa9c2b2ab
-
-Package: TSP
-Source: CRAN
-Version: 1.1-4
-Hash: d9362c64bfa5880eafd9050fe7cda5c4
-Requires: foreach
-
-Package: assertthat
-Source: CRAN
-Version: 0.1
-Hash: 0afb92b59b02593c70ff8046700ba9d3
-
-Package: badgecreatr
-Source: CRAN
-Version: 0.1.0
-Hash: 5f0441ad49972a36c301a5ad4a4b3993
-Requires: stringr
-
-Package: base64enc
-Source: CRAN
-Version: 0.1-3
-Hash: c590d29e555926af053055e23ee79efb
-
-Package: bitops
-Source: CRAN
-Version: 1.0-6
-Hash: 67d0775189fd0041d95abca618c5c07e
-
-Package: brew
-Source: CRAN
-Version: 1.0-6
-Hash: 931f9972deae0f205e1c78a51f33149b
-
-Package: caTools
-Source: CRAN
-Version: 1.17.1
-Hash: 97cb6f6293cd18d17df77a6383cc6763
-Requires: bitops
-
-Package: colorspace
-Source: CRAN
-Version: 1.2-6
-Hash: 00bb12245cd975c450cc4a960884fa15
-
-Package: crayon
-Source: CRAN
-Version: 1.3.2
-Hash: 576a9d297a567d6a5ebd164ca5221590
-
-Package: curl
-Source: CRAN
-Version: 2.1
-Hash: e3d6a6a421b8418ae333894b6a16829f
-
-Package: dendextend
-Source: CRAN
-Version: 1.2.0
-Hash: fd858c4254ec5c9871a28e902ab01fa2
-Requires: fpc, ggplot2, magrittr, whisker
-
-Package: devtools
-Source: CRAN
-Version: 1.12.0
-Hash: bbad95109ae75cbb14099281cda43af2
-Requires: digest, git2r, httr, jsonlite, memoise, rstudioapi, whisker,
- withr
-
-Package: dichromat
-Source: CRAN
-Version: 2.0-0
-Hash: 08eed0c80510af29bb15f840ccfe37ce
-
-Package: digest
-Source: CRAN
-Version: 0.6.10
-Hash: 87165608ca8aeb0958835c3c5b52b6b7
-
-Package: diptest
-Source: CRAN
-Version: 0.75-7
-Hash: de93e5330ff45c5795d0bae12c8a9695
-
-Package: dplyr
-Source: CRAN
-Version: 0.5.0
-Hash: 03e5e71801c0f49217922e2cd4680f06
-Requires: BH, DBI, R6, Rcpp, assertthat, lazyeval, magrittr, tibble
-
-Package: evaluate
-Source: CRAN
-Version: 0.9
-Hash: cf338d73ba4ee3a4fefec612cdfd38db
-Requires: stringr
-
-Package: flexmix
-Source: CRAN
-Version: 2.3-13
-Hash: 4c5ae92368e1cc01c26afd1e67b66cd3
-Requires: modeltools
-
-Package: foreach
-Source: CRAN
-Version: 1.4.3
-Hash: cd53ef4cf29dc59ce3f8c5c1af735fd1
-Requires: iterators
-
-Package: formatR
-Source: CRAN
-Version: 1.4
-Hash: b2a47a2b91737978cf50ba95825a9cd1
-
-Package: fpc
-Source: CRAN
-Version: 2.1-10
-Hash: e537c1c8a52f67db5296c272e9090cbc
-Requires: diptest, flexmix, kernlab, mclust, mvtnorm, prabclus,
- robustbase, trimcluster
-
-Package: gclus
-Source: CRAN
-Version: 1.3.1
-Hash: d6047d34e2f634d2163405db9a3f7774
-
-Package: gdata
-Source: CRAN
-Version: 2.17.0
-Hash: e7d520c2a9597b303f54499e3bd90644
-Requires: gtools
-
-Package: ggplot2
-Source: CRAN
-Version: 2.2.0
-Hash: 78c14285e0c114542d051a09bd552472
-Requires: digest, gtable, lazyeval, plyr, reshape2, scales, tibble
-
-Package: ggrepel
-Source: CRAN
-Version: 0.6.3
-Hash: df268483bd8efae71ce0031b5a42603c
-Requires: Rcpp, ggplot2, scales
-
-Package: git2r
-Source: CRAN
-Version: 0.15.0
-Hash: 92d5a9f3cba5e146b92a76dabbc29fbb
-
-Package: gplots
-Source: CRAN
-Version: 3.0.1
-Hash: b7abe122479c203aa236499b7fc4b816
-Requires: caTools, gdata, gtools
-
-Package: gtable
-Source: CRAN
-Version: 0.2.0
-Hash: cd78381a9d3fea966ac39bd0daaf5554
-
-Package: gtools
-Source: CRAN
-Version: 3.5.0
-Hash: 471b2e2452dfb30fdc1dd6f1b567925a
-
-Package: highr
-Source: CRAN
-Version: 0.6
-Hash: aa3d5b7912b5fed4b546ed5cd2a1760b
-
-Package: htmltools
-Source: CRAN
-Version: 0.3.5
-Hash: a96dc1cfe628e66337c86be732567df2
-Requires: Rcpp, digest
-
-Package: httr
-Source: CRAN
-Version: 1.2.1
-Hash: 7de1f8f760441881804af7c1ff324340
-Requires: R6, curl, jsonlite, mime, openssl
-
-Package: iterators
-Source: CRAN
-Version: 1.0.8
-Hash: 488b93c2a4166db0d15f1e8d882cb1d4
-
-Package: jsonlite
-Source: CRAN
-Version: 1.1
-Hash: 86d4b85b84421a4815f1bb4872e30ef4
-
-Package: kernlab
-Source: CRAN
-Version: 0.9-24
-Hash: 37726d9307b8183493bb9187ea0cde8c
-
-Package: knitr
-Source: CRAN
-Version: 1.14
-Hash: e7b411f5a5512295a260a45683fa0c4a
-Requires: digest, evaluate, formatR, highr, markdown, stringr, yaml
-
-Package: labeling
-Source: CRAN
-Version: 0.3
-Hash: ecf589b42cd284b03a4beb9665482d3e
-
-Package: lazyeval
-Source: CRAN
-Version: 0.2.0
-Hash: 3d6e7608e65bbf5cb170dab1e3c9ed8b
-
-Package: magrittr
-Source: CRAN
-Version: 1.5
-Hash: bdc4d48c3135e8f3b399536ddf160df4
-
-Package: markdown
-Source: CRAN
-Version: 0.7.7
-Hash: fea2343a1119d61b0cc5c0a950d103a3
-Requires: mime
-
-Package: mclust
-Source: CRAN
-Version: 5.2
-Hash: 77406ad6a64bb972a5e05b658161261d
-
-Package: memoise
-Source: CRAN
-Version: 1.0.0
-Hash: 56e7087c3559eb7ba72a9afb349bf896
-Requires: digest
-
-Package: mime
-Source: CRAN
-Version: 0.5
-Hash: 463550cf44fb6f0a2359368f42eebe62
-
-Package: modeltools
-Source: CRAN
-Version: 0.2-21
-Hash: 3dc03397b2a4375c8a5e5f09c8cf0ae1
-
-Package: munsell
-Source: CRAN
-Version: 0.4.3
-Hash: f96d896947fcaf9b6d0074002e9f4f9d
-Requires: colorspace
-
-Package: mvtnorm
-Source: CRAN
-Version: 1.0-5
-Hash: 55a3581188e15f13f5ba19c18e151ac2
-
-Package: openssl
-Source: CRAN
-Version: 0.9.4
-Hash: 5ceb5d83bba44e8e5a764ac6ad32e9fb
-
-Package: packrat
-Source: CRAN
-Version: 0.4.7-1
-Hash: 16ca16d36eb18d1d16113606ecc5c400
-
-Package: plyr
-Source: CRAN
-Version: 1.8.4
-Hash: 75ca080b10a9314a9b293964331e5df7
-Requires: Rcpp
-
-Package: prabclus
-Source: CRAN
-Version: 2.2-6
-Hash: e646245afbb6b8ed25e22e8a76b781cd
-Requires: mclust
-
-Package: praise
-Source: CRAN
-Version: 1.0.0
-Hash: 77da8f1df873a4b91e5c4a68fe2fb1b6
-
-Package: purrr
-Source: CRAN
-Version: 0.2.2
-Hash: 14bc8b3a4c61f67866ebfb413f77ff9f
-Requires: BH, Rcpp, dplyr, lazyeval, magrittr
-
-Package: qap
-Source: CRAN
-Version: 0.1-0
-Hash: c15a4e38f99efb0c7199d36617480431
-
-Package: registry
-Source: CRAN
-Version: 0.3
-Hash: f9447c26b51b8c96f53720c5ff862c93
-
-Package: reshape2
-Source: CRAN
-Version: 1.4.1
-Hash: c9a8d2349fe969cf519dd0ced9cc1414
-Requires: Rcpp, plyr, stringr
-
-Package: rmarkdown
-Source: github
-Version: 1.0.9014
-Hash: 7701c44c82bf23e5bba1e9dff4ac1982
-Requires: base64enc, caTools, evaluate, htmltools, jsonlite, knitr,
- tibble, yaml
-GithubRepo: rmarkdown
-GithubUsername: rstudio
-GithubRef: master
-GithubSha1: 81c209271e06266115e08263dbcde5d007e4d77c
-
-Package: robustbase
-Source: CRAN
-Version: 0.92-6
-Hash: 2819fff51bd1e827b611126fc0227d46
-Requires: DEoptimR
-
-Package: roxygen2
-Source: CRAN
-Version: 5.0.1
-Hash: 77e2e933d3709300a251c7ef9cef82fc
-Requires: Rcpp, brew, digest, stringi, stringr
-
-Package: rstudioapi
-Source: CRAN
-Version: 0.6
-Hash: fd256f8bfb9a64cc35f98b0decb1a79f
-
-Package: rversions
-Source: CRAN
-Version: 1.0.3
-Hash: 44837671df6bf1d0b863dc6f83f42a16
-Requires: curl, xml2
-
-Package: scales
-Source: CRAN
-Version: 0.4.1
-Hash: c0b89e928595f6133fe9d5dc139060b0
-Requires: RColorBrewer, Rcpp, dichromat, labeling, munsell, plyr
-
-Package: seriation
-Source: CRAN
-Version: 1.2-0
-Hash: 9b6894e8a71289c03e7565d52402e5c9
-Requires: TSP, colorspace, dendextend, gclus, gplots, qap, registry
-
-Package: stringi
-Source: CRAN
-Version: 1.1.2
-Hash: 1ad6b1cc11d982ac233bf2fa2f7c9684
-
-Package: stringr
-Source: CRAN
-Version: 1.1.0
-Hash: 4d21d0063b37a17ea18eaec6acd29bf3
-Requires: magrittr, stringi
-
-Package: testthat
-Source: CRAN
-Version: 1.0.2
-Hash: 88d5291104227f9dc2e7c7c1d0eb6c74
-Requires: R6, crayon, digest, magrittr, praise
-
-Package: tibble
-Source: CRAN
-Version: 1.2
-Hash: 3b35b556ef7acddb0d28fe6a27ad50e4
-Requires: Rcpp, assertthat, lazyeval
-
-Package: tidyr
-Source: CRAN
-Version: 0.6.0
-Hash: daf06bb30f2d9581e69609e0c0f7d38a
-Requires: Rcpp, dplyr, lazyeval, magrittr, stringi, tibble
-
-Package: trimcluster
-Source: CRAN
-Version: 0.1-2
-Hash: 662a899a1377c7d3f2cef1722e335aff
-
-Package: whisker
-Source: CRAN
-Version: 0.3-2
-Hash: 803d662762e532705c2c066a82d066e7
-
-Package: withr
-Source: CRAN
-Version: 1.0.2
-Hash: 774eb7be9087cdc24b53b74e5359cfac
-
-Package: xml2
-Source: CRAN
-Version: 1.0.0
-Hash: a55c497b694e044296830eb8ac5c2fee
-Requires: BH, Rcpp
-
-Package: yaml
-Source: CRAN
-Version: 2.1.13
-Hash: 4854ccabebc225e8a7309fb4a74980de
diff --git a/packrat/packrat.opts b/packrat/packrat.opts
deleted file mode 100644
index 502a18f..0000000
--- a/packrat/packrat.opts
+++ /dev/null
@@ -1,11 +0,0 @@
-auto.snapshot: TRUE
-use.cache: FALSE
-print.banner.on.startup: auto
-vcs.ignore.lib: TRUE
-vcs.ignore.src: FALSE
-external.packages:
-local.repos:
-load.external.packages.on.startup: TRUE
-ignored.packages:
-quiet.package.installation: TRUE
-snapshot.recommended.packages: FALSE
diff --git a/packrat/src/BH/BH_1.60.0-2.tar.gz b/packrat/src/BH/BH_1.60.0-2.tar.gz
deleted file mode 100644
index 48c009c..0000000
Binary files a/packrat/src/BH/BH_1.60.0-2.tar.gz and /dev/null differ
diff --git a/packrat/src/DBI/DBI_0.5-1.tar.gz b/packrat/src/DBI/DBI_0.5-1.tar.gz
deleted file mode 100644
index 35e1453..0000000
Binary files a/packrat/src/DBI/DBI_0.5-1.tar.gz and /dev/null differ
diff --git a/packrat/src/DEoptimR/DEoptimR_1.0-6.tar.gz b/packrat/src/DEoptimR/DEoptimR_1.0-6.tar.gz
deleted file mode 100644
index a47959c..0000000
Binary files a/packrat/src/DEoptimR/DEoptimR_1.0-6.tar.gz and /dev/null differ
diff --git a/packrat/src/R6/R6_2.1.2.tar.gz b/packrat/src/R6/R6_2.1.2.tar.gz
deleted file mode 100644
index bc70b82..0000000
Binary files a/packrat/src/R6/R6_2.1.2.tar.gz and /dev/null differ
diff --git a/packrat/src/R6/R6_2.1.3.tar.gz b/packrat/src/R6/R6_2.1.3.tar.gz
deleted file mode 100644
index f91f260..0000000
Binary files a/packrat/src/R6/R6_2.1.3.tar.gz and /dev/null differ
diff --git a/packrat/src/RColorBrewer/RColorBrewer_1.1-2.tar.gz b/packrat/src/RColorBrewer/RColorBrewer_1.1-2.tar.gz
deleted file mode 100644
index ef04e6b..0000000
Binary files a/packrat/src/RColorBrewer/RColorBrewer_1.1-2.tar.gz and /dev/null differ
diff --git a/packrat/src/Rcpp/Rcpp_0.12.7.tar.gz b/packrat/src/Rcpp/Rcpp_0.12.7.tar.gz
deleted file mode 100644
index 21c710b..0000000
Binary files a/packrat/src/Rcpp/Rcpp_0.12.7.tar.gz and /dev/null differ
diff --git a/packrat/src/TSP/TSP_1.1-4.tar.gz b/packrat/src/TSP/TSP_1.1-4.tar.gz
deleted file mode 100644
index 287ad58..0000000
Binary files a/packrat/src/TSP/TSP_1.1-4.tar.gz and /dev/null differ
diff --git a/packrat/src/assertthat/assertthat_0.1.tar.gz b/packrat/src/assertthat/assertthat_0.1.tar.gz
deleted file mode 100644
index f66fd7c..0000000
Binary files a/packrat/src/assertthat/assertthat_0.1.tar.gz and /dev/null differ
diff --git a/packrat/src/badgecreatr/badgecreatr_0.1.0.tar.gz b/packrat/src/badgecreatr/badgecreatr_0.1.0.tar.gz
deleted file mode 100644
index 6af67e9..0000000
Binary files a/packrat/src/badgecreatr/badgecreatr_0.1.0.tar.gz and /dev/null differ
diff --git a/packrat/src/base64enc/base64enc_0.1-3.tar.gz b/packrat/src/base64enc/base64enc_0.1-3.tar.gz
deleted file mode 100644
index 07c2782..0000000
Binary files a/packrat/src/base64enc/base64enc_0.1-3.tar.gz and /dev/null differ
diff --git a/packrat/src/bitops/bitops_1.0-6.tar.gz b/packrat/src/bitops/bitops_1.0-6.tar.gz
deleted file mode 100644
index ed4a934..0000000
Binary files a/packrat/src/bitops/bitops_1.0-6.tar.gz and /dev/null differ
diff --git a/packrat/src/brew/brew_1.0-6.tar.gz b/packrat/src/brew/brew_1.0-6.tar.gz
deleted file mode 100644
index e3c9598..0000000
Binary files a/packrat/src/brew/brew_1.0-6.tar.gz and /dev/null differ
diff --git a/packrat/src/caTools/caTools_1.17.1.tar.gz b/packrat/src/caTools/caTools_1.17.1.tar.gz
deleted file mode 100644
index 24b9050..0000000
Binary files a/packrat/src/caTools/caTools_1.17.1.tar.gz and /dev/null differ
diff --git a/packrat/src/colorspace/colorspace_1.2-6.tar.gz b/packrat/src/colorspace/colorspace_1.2-6.tar.gz
deleted file mode 100644
index 5f87432..0000000
Binary files a/packrat/src/colorspace/colorspace_1.2-6.tar.gz and /dev/null differ
diff --git a/packrat/src/crayon/crayon_1.3.2.tar.gz b/packrat/src/crayon/crayon_1.3.2.tar.gz
deleted file mode 100644
index 8943f42..0000000
Binary files a/packrat/src/crayon/crayon_1.3.2.tar.gz and /dev/null differ
diff --git a/packrat/src/curl/curl_2.1.tar.gz b/packrat/src/curl/curl_2.1.tar.gz
deleted file mode 100644
index d303287..0000000
Binary files a/packrat/src/curl/curl_2.1.tar.gz and /dev/null differ
diff --git a/packrat/src/dendextend/dendextend_1.2.0.tar.gz b/packrat/src/dendextend/dendextend_1.2.0.tar.gz
deleted file mode 100644
index 020f693..0000000
Binary files a/packrat/src/dendextend/dendextend_1.2.0.tar.gz and /dev/null differ
diff --git a/packrat/src/devtools/devtools_1.12.0.tar.gz b/packrat/src/devtools/devtools_1.12.0.tar.gz
deleted file mode 100644
index 03f67b7..0000000
Binary files a/packrat/src/devtools/devtools_1.12.0.tar.gz and /dev/null differ
diff --git a/packrat/src/dichromat/dichromat_2.0-0.tar.gz b/packrat/src/dichromat/dichromat_2.0-0.tar.gz
deleted file mode 100644
index beb1e15..0000000
Binary files a/packrat/src/dichromat/dichromat_2.0-0.tar.gz and /dev/null differ
diff --git a/packrat/src/digest/digest_0.6.10.tar.gz b/packrat/src/digest/digest_0.6.10.tar.gz
deleted file mode 100644
index d58fc69..0000000
Binary files a/packrat/src/digest/digest_0.6.10.tar.gz and /dev/null differ
diff --git a/packrat/src/diptest/diptest_0.75-7.tar.gz b/packrat/src/diptest/diptest_0.75-7.tar.gz
deleted file mode 100644
index 115bcc2..0000000
Binary files a/packrat/src/diptest/diptest_0.75-7.tar.gz and /dev/null differ
diff --git a/packrat/src/dplyr/dplyr_0.5.0.tar.gz b/packrat/src/dplyr/dplyr_0.5.0.tar.gz
deleted file mode 100644
index ac12287..0000000
Binary files a/packrat/src/dplyr/dplyr_0.5.0.tar.gz and /dev/null differ
diff --git a/packrat/src/evaluate/evaluate_0.9.tar.gz b/packrat/src/evaluate/evaluate_0.9.tar.gz
deleted file mode 100644
index 4e9f7e2..0000000
Binary files a/packrat/src/evaluate/evaluate_0.9.tar.gz and /dev/null differ
diff --git a/packrat/src/flexmix/flexmix_2.3-13.tar.gz b/packrat/src/flexmix/flexmix_2.3-13.tar.gz
deleted file mode 100644
index 5538afa..0000000
Binary files a/packrat/src/flexmix/flexmix_2.3-13.tar.gz and /dev/null differ
diff --git a/packrat/src/foreach/foreach_1.4.3.tar.gz b/packrat/src/foreach/foreach_1.4.3.tar.gz
deleted file mode 100644
index 174ceea..0000000
Binary files a/packrat/src/foreach/foreach_1.4.3.tar.gz and /dev/null differ
diff --git a/packrat/src/formatR/formatR_1.4.tar.gz b/packrat/src/formatR/formatR_1.4.tar.gz
deleted file mode 100644
index 8e52220..0000000
Binary files a/packrat/src/formatR/formatR_1.4.tar.gz and /dev/null differ
diff --git a/packrat/src/fpc/fpc_2.1-10.tar.gz b/packrat/src/fpc/fpc_2.1-10.tar.gz
deleted file mode 100644
index cd10342..0000000
Binary files a/packrat/src/fpc/fpc_2.1-10.tar.gz and /dev/null differ
diff --git a/packrat/src/gclus/gclus_1.3.1.tar.gz b/packrat/src/gclus/gclus_1.3.1.tar.gz
deleted file mode 100644
index 7aa7dda..0000000
Binary files a/packrat/src/gclus/gclus_1.3.1.tar.gz and /dev/null differ
diff --git a/packrat/src/gdata/gdata_2.17.0.tar.gz b/packrat/src/gdata/gdata_2.17.0.tar.gz
deleted file mode 100644
index 329df53..0000000
Binary files a/packrat/src/gdata/gdata_2.17.0.tar.gz and /dev/null differ
diff --git a/packrat/src/ggplot2/feb3ffde873fcc720eb045ce9bde1bd3c274239c.tar.gz b/packrat/src/ggplot2/feb3ffde873fcc720eb045ce9bde1bd3c274239c.tar.gz
deleted file mode 100644
index f91f6c3..0000000
Binary files a/packrat/src/ggplot2/feb3ffde873fcc720eb045ce9bde1bd3c274239c.tar.gz and /dev/null differ
diff --git a/packrat/src/ggplot2/ggplot2_2.1.0.tar.gz b/packrat/src/ggplot2/ggplot2_2.1.0.tar.gz
deleted file mode 100644
index 451cef3..0000000
Binary files a/packrat/src/ggplot2/ggplot2_2.1.0.tar.gz and /dev/null differ
diff --git a/packrat/src/ggplot2/ggplot2_2.2.0.tar.gz b/packrat/src/ggplot2/ggplot2_2.2.0.tar.gz
deleted file mode 100644
index 3f87cf0..0000000
Binary files a/packrat/src/ggplot2/ggplot2_2.2.0.tar.gz and /dev/null differ
diff --git a/packrat/src/ggrepel/ggrepel_0.5.tar.gz b/packrat/src/ggrepel/ggrepel_0.5.tar.gz
deleted file mode 100644
index 4c9bacf..0000000
Binary files a/packrat/src/ggrepel/ggrepel_0.5.tar.gz and /dev/null differ
diff --git a/packrat/src/ggrepel/ggrepel_0.6.3.tar.gz b/packrat/src/ggrepel/ggrepel_0.6.3.tar.gz
deleted file mode 100644
index fc750e3..0000000
Binary files a/packrat/src/ggrepel/ggrepel_0.6.3.tar.gz and /dev/null differ
diff --git a/packrat/src/git2r/git2r_0.15.0.tar.gz b/packrat/src/git2r/git2r_0.15.0.tar.gz
deleted file mode 100644
index bc6d08f..0000000
Binary files a/packrat/src/git2r/git2r_0.15.0.tar.gz and /dev/null differ
diff --git a/packrat/src/gplots/gplots_3.0.1.tar.gz b/packrat/src/gplots/gplots_3.0.1.tar.gz
deleted file mode 100644
index eae8887..0000000
Binary files a/packrat/src/gplots/gplots_3.0.1.tar.gz and /dev/null differ
diff --git a/packrat/src/gtable/gtable_0.2.0.tar.gz b/packrat/src/gtable/gtable_0.2.0.tar.gz
deleted file mode 100644
index 49c35fa..0000000
Binary files a/packrat/src/gtable/gtable_0.2.0.tar.gz and /dev/null differ
diff --git a/packrat/src/gtools/gtools_3.5.0.tar.gz b/packrat/src/gtools/gtools_3.5.0.tar.gz
deleted file mode 100644
index 7d3abc0..0000000
Binary files a/packrat/src/gtools/gtools_3.5.0.tar.gz and /dev/null differ
diff --git a/packrat/src/highr/highr_0.6.tar.gz b/packrat/src/highr/highr_0.6.tar.gz
deleted file mode 100644
index 82872a6..0000000
Binary files a/packrat/src/highr/highr_0.6.tar.gz and /dev/null differ
diff --git a/packrat/src/htmltools/htmltools_0.3.5.tar.gz b/packrat/src/htmltools/htmltools_0.3.5.tar.gz
deleted file mode 100644
index 79dcb67..0000000
Binary files a/packrat/src/htmltools/htmltools_0.3.5.tar.gz and /dev/null differ
diff --git a/packrat/src/httr/httr_1.2.1.tar.gz b/packrat/src/httr/httr_1.2.1.tar.gz
deleted file mode 100644
index c02f0d5..0000000
Binary files a/packrat/src/httr/httr_1.2.1.tar.gz and /dev/null differ
diff --git a/packrat/src/iterators/iterators_1.0.8.tar.gz b/packrat/src/iterators/iterators_1.0.8.tar.gz
deleted file mode 100644
index e13ce0f..0000000
Binary files a/packrat/src/iterators/iterators_1.0.8.tar.gz and /dev/null differ
diff --git a/packrat/src/jsonlite/jsonlite_1.0.tar.gz b/packrat/src/jsonlite/jsonlite_1.0.tar.gz
deleted file mode 100644
index 428387d..0000000
Binary files a/packrat/src/jsonlite/jsonlite_1.0.tar.gz and /dev/null differ
diff --git a/packrat/src/jsonlite/jsonlite_1.1.tar.gz b/packrat/src/jsonlite/jsonlite_1.1.tar.gz
deleted file mode 100644
index df648a1..0000000
Binary files a/packrat/src/jsonlite/jsonlite_1.1.tar.gz and /dev/null differ
diff --git a/packrat/src/kernlab/kernlab_0.9-24.tar.gz b/packrat/src/kernlab/kernlab_0.9-24.tar.gz
deleted file mode 100644
index 3dc5b56..0000000
Binary files a/packrat/src/kernlab/kernlab_0.9-24.tar.gz and /dev/null differ
diff --git a/packrat/src/knitr/knitr_1.14.tar.gz b/packrat/src/knitr/knitr_1.14.tar.gz
deleted file mode 100644
index 4daff79..0000000
Binary files a/packrat/src/knitr/knitr_1.14.tar.gz and /dev/null differ
diff --git a/packrat/src/labeling/labeling_0.3.tar.gz b/packrat/src/labeling/labeling_0.3.tar.gz
deleted file mode 100644
index 0e47612..0000000
Binary files a/packrat/src/labeling/labeling_0.3.tar.gz and /dev/null differ
diff --git a/packrat/src/lazyeval/lazyeval_0.2.0.tar.gz b/packrat/src/lazyeval/lazyeval_0.2.0.tar.gz
deleted file mode 100644
index 1a7507c..0000000
Binary files a/packrat/src/lazyeval/lazyeval_0.2.0.tar.gz and /dev/null differ
diff --git a/packrat/src/magrittr/magrittr_1.5.tar.gz b/packrat/src/magrittr/magrittr_1.5.tar.gz
deleted file mode 100644
index e2f9860..0000000
Binary files a/packrat/src/magrittr/magrittr_1.5.tar.gz and /dev/null differ
diff --git a/packrat/src/markdown/markdown_0.7.7.tar.gz b/packrat/src/markdown/markdown_0.7.7.tar.gz
deleted file mode 100644
index 953dc67..0000000
Binary files a/packrat/src/markdown/markdown_0.7.7.tar.gz and /dev/null differ
diff --git a/packrat/src/mclust/mclust_5.2.tar.gz b/packrat/src/mclust/mclust_5.2.tar.gz
deleted file mode 100644
index 3f1f78e..0000000
Binary files a/packrat/src/mclust/mclust_5.2.tar.gz and /dev/null differ
diff --git a/packrat/src/memoise/memoise_1.0.0.tar.gz b/packrat/src/memoise/memoise_1.0.0.tar.gz
deleted file mode 100644
index c4195e0..0000000
Binary files a/packrat/src/memoise/memoise_1.0.0.tar.gz and /dev/null differ
diff --git a/packrat/src/mime/mime_0.5.tar.gz b/packrat/src/mime/mime_0.5.tar.gz
deleted file mode 100644
index 221519b..0000000
Binary files a/packrat/src/mime/mime_0.5.tar.gz and /dev/null differ
diff --git a/packrat/src/modeltools/modeltools_0.2-21.tar.gz b/packrat/src/modeltools/modeltools_0.2-21.tar.gz
deleted file mode 100644
index 5895b28..0000000
Binary files a/packrat/src/modeltools/modeltools_0.2-21.tar.gz and /dev/null differ
diff --git a/packrat/src/munsell/munsell_0.4.3.tar.gz b/packrat/src/munsell/munsell_0.4.3.tar.gz
deleted file mode 100644
index 4a4f6b3..0000000
Binary files a/packrat/src/munsell/munsell_0.4.3.tar.gz and /dev/null differ
diff --git a/packrat/src/mvtnorm/mvtnorm_1.0-5.tar.gz b/packrat/src/mvtnorm/mvtnorm_1.0-5.tar.gz
deleted file mode 100644
index b355009..0000000
Binary files a/packrat/src/mvtnorm/mvtnorm_1.0-5.tar.gz and /dev/null differ
diff --git a/packrat/src/openssl/openssl_0.9.4.tar.gz b/packrat/src/openssl/openssl_0.9.4.tar.gz
deleted file mode 100644
index 38614f4..0000000
Binary files a/packrat/src/openssl/openssl_0.9.4.tar.gz and /dev/null differ
diff --git a/packrat/src/packrat/packrat_0.4.7-1.tar.gz b/packrat/src/packrat/packrat_0.4.7-1.tar.gz
deleted file mode 100644
index 697e41f..0000000
Binary files a/packrat/src/packrat/packrat_0.4.7-1.tar.gz and /dev/null differ
diff --git a/packrat/src/plyr/plyr_1.8.4.tar.gz b/packrat/src/plyr/plyr_1.8.4.tar.gz
deleted file mode 100644
index 42a77f8..0000000
Binary files a/packrat/src/plyr/plyr_1.8.4.tar.gz and /dev/null differ
diff --git a/packrat/src/prabclus/prabclus_2.2-6.tar.gz b/packrat/src/prabclus/prabclus_2.2-6.tar.gz
deleted file mode 100644
index 70574c2..0000000
Binary files a/packrat/src/prabclus/prabclus_2.2-6.tar.gz and /dev/null differ
diff --git a/packrat/src/praise/praise_1.0.0.tar.gz b/packrat/src/praise/praise_1.0.0.tar.gz
deleted file mode 100644
index 0753c4b..0000000
Binary files a/packrat/src/praise/praise_1.0.0.tar.gz and /dev/null differ
diff --git a/packrat/src/purrr/purrr_0.2.2.tar.gz b/packrat/src/purrr/purrr_0.2.2.tar.gz
deleted file mode 100644
index 58ec669..0000000
Binary files a/packrat/src/purrr/purrr_0.2.2.tar.gz and /dev/null differ
diff --git a/packrat/src/qap/qap_0.1-0.tar.gz b/packrat/src/qap/qap_0.1-0.tar.gz
deleted file mode 100644
index dbe1846..0000000
Binary files a/packrat/src/qap/qap_0.1-0.tar.gz and /dev/null differ
diff --git a/packrat/src/registry/registry_0.3.tar.gz b/packrat/src/registry/registry_0.3.tar.gz
deleted file mode 100644
index e187094..0000000
Binary files a/packrat/src/registry/registry_0.3.tar.gz and /dev/null differ
diff --git a/packrat/src/reshape2/reshape2_1.4.1.tar.gz b/packrat/src/reshape2/reshape2_1.4.1.tar.gz
deleted file mode 100644
index 8849a2b..0000000
Binary files a/packrat/src/reshape2/reshape2_1.4.1.tar.gz and /dev/null differ
diff --git a/packrat/src/rmarkdown/81c209271e06266115e08263dbcde5d007e4d77c.tar.gz b/packrat/src/rmarkdown/81c209271e06266115e08263dbcde5d007e4d77c.tar.gz
deleted file mode 100644
index c56c5b4..0000000
Binary files a/packrat/src/rmarkdown/81c209271e06266115e08263dbcde5d007e4d77c.tar.gz and /dev/null differ
diff --git a/packrat/src/robustbase/robustbase_0.92-6.tar.gz b/packrat/src/robustbase/robustbase_0.92-6.tar.gz
deleted file mode 100644
index 8878412..0000000
Binary files a/packrat/src/robustbase/robustbase_0.92-6.tar.gz and /dev/null differ
diff --git a/packrat/src/roxygen2/roxygen2_5.0.1.tar.gz b/packrat/src/roxygen2/roxygen2_5.0.1.tar.gz
deleted file mode 100644
index 50875ef..0000000
Binary files a/packrat/src/roxygen2/roxygen2_5.0.1.tar.gz and /dev/null differ
diff --git a/packrat/src/rstudioapi/rstudioapi_0.6.tar.gz b/packrat/src/rstudioapi/rstudioapi_0.6.tar.gz
deleted file mode 100644
index 2ba9ed2..0000000
Binary files a/packrat/src/rstudioapi/rstudioapi_0.6.tar.gz and /dev/null differ
diff --git a/packrat/src/rversions/rversions_1.0.3.tar.gz b/packrat/src/rversions/rversions_1.0.3.tar.gz
deleted file mode 100644
index adea153..0000000
Binary files a/packrat/src/rversions/rversions_1.0.3.tar.gz and /dev/null differ
diff --git a/packrat/src/scales/d58d83a9a6b344c1cb1a9e15373c7cd2bfb7f3d1.tar.gz b/packrat/src/scales/d58d83a9a6b344c1cb1a9e15373c7cd2bfb7f3d1.tar.gz
deleted file mode 100644
index 3a53dae..0000000
Binary files a/packrat/src/scales/d58d83a9a6b344c1cb1a9e15373c7cd2bfb7f3d1.tar.gz and /dev/null differ
diff --git a/packrat/src/scales/scales_0.4.0.tar.gz b/packrat/src/scales/scales_0.4.0.tar.gz
deleted file mode 100644
index eb12ef2..0000000
Binary files a/packrat/src/scales/scales_0.4.0.tar.gz and /dev/null differ
diff --git a/packrat/src/scales/scales_0.4.1.tar.gz b/packrat/src/scales/scales_0.4.1.tar.gz
deleted file mode 100644
index 454a143..0000000
Binary files a/packrat/src/scales/scales_0.4.1.tar.gz and /dev/null differ
diff --git a/packrat/src/seriation/seriation_1.2-0.tar.gz b/packrat/src/seriation/seriation_1.2-0.tar.gz
deleted file mode 100644
index f75cf28..0000000
Binary files a/packrat/src/seriation/seriation_1.2-0.tar.gz and /dev/null differ
diff --git a/packrat/src/stringi/stringi_1.1.2.tar.gz b/packrat/src/stringi/stringi_1.1.2.tar.gz
deleted file mode 100644
index c63e284..0000000
Binary files a/packrat/src/stringi/stringi_1.1.2.tar.gz and /dev/null differ
diff --git a/packrat/src/stringr/stringr_1.1.0.tar.gz b/packrat/src/stringr/stringr_1.1.0.tar.gz
deleted file mode 100644
index b247b00..0000000
Binary files a/packrat/src/stringr/stringr_1.1.0.tar.gz and /dev/null differ
diff --git a/packrat/src/testthat/testthat_1.0.2.tar.gz b/packrat/src/testthat/testthat_1.0.2.tar.gz
deleted file mode 100644
index 7afea68..0000000
Binary files a/packrat/src/testthat/testthat_1.0.2.tar.gz and /dev/null differ
diff --git a/packrat/src/tibble/tibble_1.2.tar.gz b/packrat/src/tibble/tibble_1.2.tar.gz
deleted file mode 100644
index b29e8ba..0000000
Binary files a/packrat/src/tibble/tibble_1.2.tar.gz and /dev/null differ
diff --git a/packrat/src/tidyr/tidyr_0.6.0.tar.gz b/packrat/src/tidyr/tidyr_0.6.0.tar.gz
deleted file mode 100644
index 38281c4..0000000
Binary files a/packrat/src/tidyr/tidyr_0.6.0.tar.gz and /dev/null differ
diff --git a/packrat/src/trimcluster/trimcluster_0.1-2.tar.gz b/packrat/src/trimcluster/trimcluster_0.1-2.tar.gz
deleted file mode 100644
index 97007c3..0000000
Binary files a/packrat/src/trimcluster/trimcluster_0.1-2.tar.gz and /dev/null differ
diff --git a/packrat/src/whisker/whisker_0.3-2.tar.gz b/packrat/src/whisker/whisker_0.3-2.tar.gz
deleted file mode 100644
index 7e6576e..0000000
Binary files a/packrat/src/whisker/whisker_0.3-2.tar.gz and /dev/null differ
diff --git a/packrat/src/withr/withr_1.0.2.tar.gz b/packrat/src/withr/withr_1.0.2.tar.gz
deleted file mode 100644
index 5b531fa..0000000
Binary files a/packrat/src/withr/withr_1.0.2.tar.gz and /dev/null differ
diff --git a/packrat/src/xml2/xml2_1.0.0.tar.gz b/packrat/src/xml2/xml2_1.0.0.tar.gz
deleted file mode 100644
index c0f6487..0000000
Binary files a/packrat/src/xml2/xml2_1.0.0.tar.gz and /dev/null differ
diff --git a/packrat/src/yaml/yaml_2.1.13.tar.gz b/packrat/src/yaml/yaml_2.1.13.tar.gz
deleted file mode 100644
index 7bcff79..0000000
Binary files a/packrat/src/yaml/yaml_2.1.13.tar.gz and /dev/null differ
diff --git a/revdep/README.md b/revdep/README.md
new file mode 100644
index 0000000..67c26c7
--- /dev/null
+++ b/revdep/README.md
@@ -0,0 +1,44 @@
+# Setup
+
+## Platform
+
+|setting |value |
+|:--------|:----------------------------|
+|version |R version 3.5.0 (2018-04-23) |
+|system |x86_64, mingw32 |
+|ui |RStudio (1.2.658) |
+|language |(EN) |
+|collate |English_United States.1252 |
+|tz |America/Chicago |
+|date |2018-06-28 |
+
+## Packages
+
+|package |* |version |date |source |
+|:---------|:--|:-------|:----------|:---------------------------|
+|corrr |* |0.3.0 |2018-06-28 |local (edgararuiz/corrr@NA) |
+|covr | |3.1.0 |2018-05-18 |CRAN (R 3.5.0) |
+|DBI | |1.0.0 |2018-05-02 |CRAN (R 3.5.0) |
+|dbplyr | |1.2.1 |2018-02-19 |CRAN (R 3.5.0) |
+|dplyr | |0.7.5 |2018-05-19 |CRAN (R 3.5.0) |
+|ggplot2 | |2.2.1 |2016-12-30 |CRAN (R 3.5.0) |
+|ggrepel | |0.8.0 |2018-05-09 |CRAN (R 3.5.0) |
+|knitr | |1.20 |2018-02-20 |CRAN (R 3.5.0) |
+|lazyeval | |0.2.1 |2017-10-29 |CRAN (R 3.5.0) |
+|magrittr | |1.5 |2014-11-22 |CRAN (R 3.5.0) |
+|purrr | |0.2.5 |2018-05-29 |CRAN (R 3.5.0) |
+|rlang | |0.2.1 |2018-05-30 |CRAN (R 3.5.0) |
+|rmarkdown | |1.10 |2018-06-11 |CRAN (R 3.5.0) |
+|RSQLite | |2.1.1 |2018-05-06 |CRAN (R 3.5.0) |
+|seriation | |1.2-3 |2018-02-05 |CRAN (R 3.5.0) |
+|testthat | |2.0.0 |2017-12-13 |CRAN (R 3.5.0) |
+|tibble | |1.4.2 |2018-01-22 |CRAN (R 3.5.0) |
+|tidyr | |0.8.1 |2018-05-18 |CRAN (R 3.5.0) |
+
+# Check results
+
+0 packages
+
+
+
+
diff --git a/revdep/check.R b/revdep/check.R
new file mode 100644
index 0000000..2ea4dd9
--- /dev/null
+++ b/revdep/check.R
@@ -0,0 +1,5 @@
+library("devtools")
+
+revdep_check()
+revdep_check_save_summary()
+revdep_check_print_problems()
\ No newline at end of file
diff --git a/revdep/checks.rds b/revdep/checks.rds
new file mode 100644
index 0000000..800b28e
Binary files /dev/null and b/revdep/checks.rds differ
diff --git a/revdep/problems.md b/revdep/problems.md
new file mode 100644
index 0000000..14e3b58
--- /dev/null
+++ b/revdep/problems.md
@@ -0,0 +1,44 @@
+# Setup
+
+## Platform
+
+|setting |value |
+|:--------|:----------------------------|
+|version |R version 3.5.0 (2018-04-23) |
+|system |x86_64, mingw32 |
+|ui |RStudio (1.2.658) |
+|language |(EN) |
+|collate |English_United States.1252 |
+|tz |America/Chicago |
+|date |2018-06-28 |
+
+## Packages
+
+|package |* |version |date |source |
+|:---------|:--|:-------|:----------|:---------------------------|
+|corrr |* |0.3.0 |2018-06-28 |local (edgararuiz/corrr@NA) |
+|covr | |3.1.0 |2018-05-18 |CRAN (R 3.5.0) |
+|DBI | |1.0.0 |2018-05-02 |CRAN (R 3.5.0) |
+|dbplyr | |1.2.1 |2018-02-19 |CRAN (R 3.5.0) |
+|dplyr | |0.7.5 |2018-05-19 |CRAN (R 3.5.0) |
+|ggplot2 | |2.2.1 |2016-12-30 |CRAN (R 3.5.0) |
+|ggrepel | |0.8.0 |2018-05-09 |CRAN (R 3.5.0) |
+|knitr | |1.20 |2018-02-20 |CRAN (R 3.5.0) |
+|lazyeval | |0.2.1 |2017-10-29 |CRAN (R 3.5.0) |
+|magrittr | |1.5 |2014-11-22 |CRAN (R 3.5.0) |
+|purrr | |0.2.5 |2018-05-29 |CRAN (R 3.5.0) |
+|rlang | |0.2.1 |2018-05-30 |CRAN (R 3.5.0) |
+|rmarkdown | |1.10 |2018-06-11 |CRAN (R 3.5.0) |
+|RSQLite | |2.1.1 |2018-05-06 |CRAN (R 3.5.0) |
+|seriation | |1.2-3 |2018-02-05 |CRAN (R 3.5.0) |
+|testthat | |2.0.0 |2017-12-13 |CRAN (R 3.5.0) |
+|tibble | |1.4.2 |2018-01-22 |CRAN (R 3.5.0) |
+|tidyr | |0.8.1 |2018-05-18 |CRAN (R 3.5.0) |
+
+# Check results
+
+0 packages with problems
+
+
+
+
diff --git a/revdep/timing.md b/revdep/timing.md
new file mode 100644
index 0000000..59483ca
--- /dev/null
+++ b/revdep/timing.md
@@ -0,0 +1,5 @@
+# Check times
+
+
+
+
diff --git a/tests/testthat.R b/tests/testthat.R
index 4e54c93..26a2471 100644
--- a/tests/testthat.R
+++ b/tests/testthat.R
@@ -1,4 +1,5 @@
library(testthat)
library(corrr)
+library(dplyr)
test_check("corrr")
diff --git a/tools/readme/combination-1.png b/tools/readme/combination-1.png
new file mode 100644
index 0000000..7be3aa8
Binary files /dev/null and b/tools/readme/combination-1.png differ
diff --git a/tools/readme/combination-2.png b/tools/readme/combination-2.png
new file mode 100644
index 0000000..84993b9
Binary files /dev/null and b/tools/readme/combination-2.png differ
diff --git a/to-cor-df.png b/tools/readme/to-cor-df.png
similarity index 100%
rename from to-cor-df.png
rename to tools/readme/to-cor-df.png