Skip to content

Commit

Permalink
use new tibble options
Browse files Browse the repository at this point in the history
  • Loading branch information
Kirill Müller committed Mar 24, 2016
1 parent 5461c1f commit 4486669
Show file tree
Hide file tree
Showing 9 changed files with 10 additions and 12 deletions.
2 changes: 0 additions & 2 deletions R/zzz.r
Original file line number Diff line number Diff line change
Expand Up @@ -2,8 +2,6 @@
op <- options()
op.dplyr <- list(
dplyr.strict_sql = FALSE,
dplyr.print_min = 10L,
dplyr.print_max = 20L,
dplyr.show_progress = TRUE
)
toset <- !(names(op.dplyr) %in% names(op))
Expand Down
6 changes: 3 additions & 3 deletions vignettes/data_frames.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ vignette: >

```{r, echo = FALSE, message = FALSE}
knitr::opts_chunk$set(collapse = T, comment = "#>")
options(dplyr.print_min = 4L, dplyr.print_max = 4L)
options(tibble.print_min = 4L, tibble.print_max = 4L)
library(dplyr)
```

Expand Down Expand Up @@ -115,8 +115,8 @@ There are three key differences between tbl_dfs and data.frames:
You can control the default appearance with options:
* `options(dplyr.print_max = n, dplyr.print_min = m)`: if more than `n`
rows print `m` rows. Use `options(dplyr.print_max = Inf)` to always
* `options(tibble.print_max = n, tibble.print_min = m)`: if more than `n`
rows print `m` rows. Use `options(tibble.print_max = Inf)` to always
show all rows.
* `options(dply.width = Inf)` will always print all columns, regardless
Expand Down
2 changes: 1 addition & 1 deletion vignettes/databases.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ vignette: >

```{r, echo = FALSE, message = FALSE}
knitr::opts_chunk$set(collapse = T, comment = "#>")
options(dplyr.print_min = 4L, dplyr.print_max = 4L)
options(tibble.print_min = 4L, tibble.print_max = 4L)
library(dplyr)
```

Expand Down
2 changes: 1 addition & 1 deletion vignettes/hybrid-evaluation.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ vignette: >

```{r, echo = FALSE, message = FALSE}
knitr::opts_chunk$set(collapse = T, comment = "#>")
options(dplyr.print_min = 4L, dplyr.print_max = 4L)
options(tibble.print_min = 4L, tibble.print_max = 4L)
library(dplyr)
```

Expand Down
2 changes: 1 addition & 1 deletion vignettes/introduction.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ vignette: >

```{r, echo = FALSE, message = FALSE}
knitr::opts_chunk$set(collapse = T, comment = "#>")
options(dplyr.print_min = 4L, dplyr.print_max = 4L)
options(tibble.print_min = 4L, tibble.print_max = 4L)
library(dplyr)
library(ggplot2)
```
Expand Down
2 changes: 1 addition & 1 deletion vignettes/new-sql-backend.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ vignette: >

```{r, echo = FALSE, message = FALSE}
knitr::opts_chunk$set(collapse = T, comment = "#>")
options(dplyr.print_min = 4L, dplyr.print_max = 4L)
options(tibble.print_min = 4L, tibble.print_max = 4L)
library(dplyr)
```

Expand Down
2 changes: 1 addition & 1 deletion vignettes/nse.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ vignette: >

```{r, echo = FALSE, message = FALSE}
knitr::opts_chunk$set(collapse = T, comment = "#>")
options(dplyr.print_min = 4L, dplyr.print_max = 4L)
options(tibble.print_min = 4L, tibble.print_max = 4L)
library(dplyr)
```

Expand Down
2 changes: 1 addition & 1 deletion vignettes/two-table.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ vignette: >

```{r, echo = FALSE, message = FALSE}
knitr::opts_chunk$set(collapse = T, comment = "#>")
options(dplyr.print_min = 5)
options(tibble.print_min = 5)
library(dplyr)
knit_print.tbl_df <- function(x, options) {
knitr::knit_print(trunc_mat(x), options)
Expand Down
2 changes: 1 addition & 1 deletion vignettes/window-functions.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@ vignette: >

```{r, echo = FALSE, message = FALSE}
knitr::opts_chunk$set(collapse = T, comment = "#>")
options(dplyr.print_min = 4L, dplyr.print_max = 4L)
options(tibble.print_min = 4L, tibble.print_max = 4L)
library(dplyr)
```

Expand Down

0 comments on commit 4486669

Please sign in to comment.