-
Notifications
You must be signed in to change notification settings - Fork 154
/
Copy pathinstall-cran.R
66 lines (56 loc) · 1.91 KB
/
install-cran.R
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
#' Attempts to install a package from CRAN.
#'
#' This function is vectorised on `pkgs` so you can install multiple
#' packages in a single command.
#'
#' @param pkgs A character vector of packages to install.
#' @inheritParams install_github
#' @export
#' @family package installation
#' @examples
#' \dontrun{
#' install_cran("ggplot2")
#' install_cran(c("httpuv", "shiny"))
#' }
install_cran <- function(pkgs, repos = getOption("repos"), type = getOption("pkgType"),
dependencies = NA,
upgrade = c("default", "ask", "always", "never"),
force = FALSE,
quiet = FALSE,
build = TRUE, build_opts = c("--no-resave-data", "--no-manual", "--no-build-vignettes"),
build_manual = FALSE, build_vignettes = FALSE,
...) {
remotes <- lapply(pkgs, cran_remote, repos = repos, type = type)
install_remotes(remotes,
dependencies = dependencies,
upgrade = upgrade,
force = force,
quiet = quiet,
build = build,
build_opts = build_opts,
build_manual = build_manual,
build_vignettes = build_vignettes,
repos = repos,
type = type,
...)
}
cran_remote <- function(pkg, repos = getOption("repos"), type = getOption("pkgType"), ...) {
repos <- fix_repositories(repos)
remote("cran",
name = pkg,
repos = repos,
pkg_type = type)
}
#' @export
remote_package_name.cran_remote <- function(remote, ...) {
remote$name
}
#' @export
remote_sha.cran_remote <- function(remote, ...) {
cran <- available_packages(remote$repos, remote$pkg_type)
trim_ws(unname(cran[, "Version"][match(remote$name, rownames(cran))]))
}
#' @export
format.cran_remote <- function(x, ...) {
"CRAN"
}