Skip to content

Commit 81eff75

Browse files
committed
don't evaluate vctrs line to avoid additional dependency
1 parent b795951 commit 81eff75

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

vignettes/ggplot2-in-packages.Rmd

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -196,7 +196,7 @@ plot.discrete_distr <- function(x, ...) {
196196

197197
If you don't use ggplot2 for your visualizations but would like to implement `autoplot()` for users that do, it is possible to register your generics only if ggplot2 is installed using `vctrs::s3_register()`.
198198

199-
```{r}
199+
```{r, eval=FALSE}
200200
.onLoad <- function(...) {
201201
if (requireNamespace("ggplot2", quietly = TRUE)) {
202202
vctrs::s3_register("ggplot2::autoplot", "discrete_distr")

0 commit comments

Comments
 (0)