We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent fc191a0 commit 5f836abCopy full SHA for 5f836ab
data-raw/faithfuld.R
@@ -3,7 +3,7 @@ library(dplyr)
3
f2d <- MASS::kde2d(faithful$eruptions, faithful$waiting, h = c(1, 10), n = 75)
4
5
faithfuld <- expand.grid(eruptions = f2d$x, waiting = f2d$y) %>%
6
- tbl_df() %>%
+ as_tibble() %>%
7
mutate(density = as.vector(f2d$z))
8
9
devtools::use_data(faithfuld, overwrite = TRUE)
0 commit comments