-
Notifications
You must be signed in to change notification settings - Fork 63
/
README.Rmd
158 lines (111 loc) · 3.74 KB
/
README.Rmd
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
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
137
138
139
140
141
142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
---
output:
github_document:
toc: true
toc_depth: 2
includes:
before_body: inst/header.md
always_allow_html: yes
editor_options:
markdown:
wrap: sentence
---
<!-- README.md is generated from README.Rmd. Please edit that file -->
```{r, include = FALSE}
knitr::opts_chunk$set(
collapse = TRUE,
comment = "#>",
fig.path = "man/figures",
out.width = "100%",
cache = TRUE,
asciicast_theme = if (Sys.getenv("IN_PKGDOWN") == "true") "pkgdown" else "readme"
)
asciicast::init_knitr_engine(
startup = quote({
library(cli)
library(pak)
pak::lib_status()
set.seed(1)
}),
echo = TRUE,
echo_input = FALSE,
interactive = FALSE
)
```
```{asciicast asciicast-setup, include = FALSE, cache = FALSE}
dir.create(.lib <- tempfile())
.libPaths(c(.lib, .libPaths()))
```
```{asciicast tmp-cache, include = FALSE, cache = FALSE}
Sys.setenv(R_USER_CACHE_DIR = tempfile())
options(cli_num_colors = 256)
```
## :rocket: Short tour
#### Install or update packages from CRAN or Bioconductor
```{asciicast cran}
pak::pkg_install("tibble")
```
#### Install packages from GitHub
```{asciicast gh}
pak::pkg_install("tidyverse/tibble")
```
#### Look up dependencies
```{asciicast deps}
pak::pkg_deps_tree("tibble")
```
#### Explain dependencies
```{asciicast explain}
pak::pkg_deps_explain("tibble", "rlang")
```
#### Install a local package and its dependencies
```{asciicast local-pre, include = FALSE}
dl <- pak::pkg_download("cli", platforms = "source", tempdir())
untar(dl$fulltarget[1])
```
```{asciicast local}
pak::local_install("cli")
```
## :link: Quick links (start here if in doubt!)
### How do I ... ?
Start at [_Get Started with pak_](https://pak.r-lib.org/reference/get-started.html) to solve specific issues.
### FAQ
Check out the [list of frequently asked questions](https://pak.r-lib.org/reference/faq.html).
### Reference
[The complete reference of pak functions](https://pak.r-lib.org/dev/reference/) is the most complete source of information about pak.
### I have a(nother) question
Don't hesitate to ask at the [RStudio Community forum](https://forum.posit.co/).
Use the `pak` tag.
### I would like to report a bug
Head to the [pak issue tracker](https://github.com/r-lib/pak/issues).
## :sparkles: Features
:zap: Fast - parallel downloads and installation, caching, etc.
:safety_vest: Safe - dependency solver, system dependency solver, etc.
:convenience_store: Convenient - packages from multiple sources, time travel, etc.
See the [complete list of awesome features](https://pak.r-lib.org/reference/features.html).
## [:arrow_down:](https://github.com/r-lib/rig#%EF%B8%8F--installation) Installation
### Pre-built binaries
Install a binary build of pak from our repository on GitHub:
``` r
install.packages("pak", repos = sprintf("https://r-lib.github.io/p/pak/stable/%s/%s/%s", .Platform$pkgType, R.Version()$os, R.Version()$arch))
```
This is supported for the following systems:
| OS | CPU | R version |
|--------------------|---------|-------------------|
| Linux | x86_64 | R 3.5.0 - R-devel |
| Linux | aarch64 | R 3.5.0 - R-devel |
| macOS High Sierra+ | x86_64 | R 3.5.0 - R-devel |
| macOS Big Sur+ | aarch64 | R 4.1.0 - R-devel |
| Windows | x86_64 | R 3.5.0 - R-devel |
For macOS we only support the official CRAN R build.
Other builds, e.g.
Homebrew R, are not supported.
### Install from CRAN
Install the released version of the package from CRAN as usual:
``` r
install.packages("pak")
```
This potentially needs a C compiler on platforms CRAN does not have binaries packages for.
### Other platforms and nightly builds
See the [installation page](https://pak.r-lib.org/reference/install.html)!
## **:blue_book:** License
GPL-3 © RStudio