Setup options: echo means R code will be displayed | cache means results will be stored for future knits
knitr::opts_chunk$set(echo = TRUE, cache = TRUE)
This is an R markdown document and requires the ‘rmarkdown’ package
install.packages('rmarkdown', repos='http://cran.us.r-project.org')
## Warning: package 'rmarkdown' is in use and will not be installed
library(rmarkdown)
The list of CRAN mirrors can be found at https://cran.r-project.org/mirrors.html
getOption("repos")
## CRAN
## "https://mran.revolutionanalytics.com/snapshot/2016-01-01"
normalizePath(.libPaths(), winslash = "/")
## [1] "C:/Program Files/Microsoft/MRO/R-3.2.3/library"
installed.packages()[, "Package"]
## assertthat base base64enc BB
## "assertthat" "base" "base64enc" "BB"
## BH bitops boot brew
## "BH" "bitops" "boot" "brew"
## caTools checkpoint class cluster
## "caTools" "checkpoint" "class" "cluster"
## codetools colorspace compiler crayon
## "codetools" "colorspace" "compiler" "crayon"
## curl datasets DBI devtools
## "curl" "datasets" "DBI" "devtools"
## dfoptim dichromat digest doParallel
## "dfoptim" "dichromat" "digest" "doParallel"
## dplyr e1071 evaluate foreach
## "dplyr" "e1071" "evaluate" "foreach"
## forecast foreign formatR Formula
## "forecast" "foreign" "formatR" "Formula"
## fracdiff gam gbm ggfortify
## "fracdiff" "gam" "gbm" "ggfortify"
## ggplot2 git2r glmnet graphics
## "ggplot2" "git2r" "glmnet" "graphics"
## grDevices grid gridBase gridExtra
## "grDevices" "grid" "gridBase" "gridExtra"
## gtable highr HSAUR2 htmltools
## "gtable" "highr" "HSAUR2" "htmltools"
## httr igraphdata irlba ISLR
## "httr" "igraphdata" "irlba" "ISLR"
## iterators jsonlite KernSmooth knitr
## "iterators" "jsonlite" "KernSmooth" "knitr"
## labeling lattice latticeExtra lazyeval
## "labeling" "lattice" "latticeExtra" "lazyeval"
## leaps magrittr markdown MASS
## "leaps" "magrittr" "markdown" "MASS"
## Matrix MatrixModels memoise methods
## "Matrix" "MatrixModels" "memoise" "methods"
## mgcv mime munsell nlme
## "mgcv" "mime" "munsell" "nlme"
## NLP nnet numDeriv openssl
## "NLP" "nnet" "numDeriv" "openssl"
## optextras packrat pacman parallel
## "optextras" "packrat" "pacman" "parallel"
## pkgmaker PKI PKPDmodels plyr
## "pkgmaker" "PKI" "PKPDmodels" "plyr"
## praise quadprog R6 randomForest
## "praise" "quadprog" "R6" "randomForest"
## Rcgmin RColorBrewer Rcpp RcppArmadillo
## "Rcgmin" "RColorBrewer" "Rcpp" "RcppArmadillo"
## RCurl registry reshape reshape2
## "RCurl" "registry" "reshape" "reshape2"
## RevoUtilsMath rgenoud RJSONIO rmarkdown
## "RevoUtilsMath" "rgenoud" "RJSONIO" "rmarkdown"
## rngtools roxygen2 rpart rsconnect
## "rngtools" "roxygen2" "rpart" "rsconnect"
## rstudioapi rversions Rvmmin sandwich
## "rstudioapi" "rversions" "Rvmmin" "sandwich"
## scales setRNG spatial splines
## "scales" "setRNG" "spatial" "splines"
## stats stats4 stringi stringr
## "stats" "stats4" "stringi" "stringr"
## survival svUnit tcltk TH.data
## "survival" "svUnit" "tcltk" "TH.data"
## tidyr timeDate tools translations
## "tidyr" "timeDate" "tools" "translations"
## tree tseries TTR utils
## "tree" "tseries" "TTR" "utils"
## whisker withr xml2 xtable
## "whisker" "withr" "xml2" "xtable"
## xts yaml zoo
## "xts" "yaml" "zoo"
# chooseCRANmirror()
options(repos=structure(c(CRAN="http://cran.us.r-project.org")))
install.packages('rmarkdown', repos='http://cran.us.r-project.org')
## Warning: package 'rmarkdown' is in use and will not be installed
local({
r <- getOption("repos")
r["CRAN"] <- "http://cran.us.r-project.org"
options(repos = r)
})
# setRepositories(addURLs =
# c(CRANxtras = "http://cran.us.r-project.org"))
# setRepositories(addURLs =
# c(CRAN = "http://cran.us.r-project.org"))
old.packages()
## NULL
(more info at https://mran.revolutionanalytics.com/timemachine/ )
The ‘checkpoint’ package from MSFT is helpful for using a specific repo snapshot more info at http://bit.ly/1Rzrqdy
This means the remainder of your script will run with the packages from a specific date.