You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
There are aggregation functions that are available in DuckDB, but duckplyr still falls back to dplyr.
discovered when benchmarking duckplyr with the db-benchmark. This example comes from group by query q9
repro
.libPaths("./duckplyr/r-duckplyr") # tidyverse/duckplyr#4641
suppressPackageStartupMessages(library("duckplyr", lib.loc="./duckplyr/r-duckplyr", warn.conflicts=FALSE))
ver = packageVersion("duckplyr")
src_grp = "test.csv"
x = as_duckplyr_tibble(data.table::fread(src_grp, showProgress=FALSE, na.strings="", data.table=FALSE))
print(nrow(x))
t = system.time(print(dim(ans<-x %>% summarise(.by = c(id2, id4), r2=cor(v1, v2, use="na.or.complete")^2))))[["elapsed"]]
The duckplyr package is configured to fall back to dplyr when it encounters an incompatibility. Fallback events can be collected and uploaded for analysis to guide future development.
By default, no data will be collected or uploaded.
ℹ A fallback situation just occurred. The following information would have been recorded:
{"version":"0.4.1","message":"No translation for function
`^`.","name":"summarise","x":{"...1":"character","...2":"character","...3":"character","...4":"integer","...5":"integer","...6":"integer","...7":"integer","...8":"integer","...9":"numeric"},"args":{"dots":{"...10":"cor(...7,
...8, use = \"<character>\")^2"},"by":["...2","...4"]}}
→ Run `duckplyr::fallback_sitrep()` to review the current settings.
→ Run `Sys.setenv(DUCKPLYR_FALLBACK_COLLECT = 1)` to enable fallback logging, and `Sys.setenv(DUCKPLYR_FALLBACK_VERBOSE = TRUE)` in addition to enable printing of fallback situations
to the console.
→ Run `duckplyr::fallback_review()` to review the available reports, and `duckplyr::fallback_upload()` to upload them.
ℹ See `?duckplyr::fallback()` for details.
============================= OLD ISSUE BEFORE EDIT (CAN IGNORE) ======================
repro
library(duckplyr)
library(DBI)
x = as_duckplyr_tibble(iris)
x %>% arrange(sum(Sepal.Length)^2)
The duckplyr package is configured to fall back to dplyr when it encounters an incompatibility. Fallback events can be collected and uploaded for analysis to guide future
development. By default, no data will be collected or uploaded.
ℹ A fallback situation just occurred. The following information would have been recorded:
{"version":"0.4.1","message":"Can't convert columns of class <factor> to relational. Affected column:
`...5`.","name":"arrange","x":{"...1":"numeric","...2":"numeric","...3":"numeric","...4":"numeric","...5":"factor"},"args":{"dots":["sum(...1)^2"],".by_group":false}}
→ Run `duckplyr::fallback_sitrep()` to review the current settings.
→ Run `Sys.setenv(DUCKPLYR_FALLBACK_COLLECT = 1)` to enable fallback logging, and `Sys.setenv(DUCKPLYR_FALLBACK_VERBOSE = TRUE)` in addition to enable printing of fallback
situations to the console.
→ Run `duckplyr::fallback_review()` to review the available reports, and `duckplyr::fallback_upload()` to upload them.
ℹ See `?duckplyr::fallback()` for details.
~~
The occurs on group by query 9 of the db benchmark.
The text was updated successfully, but these errors were encountered:
Oh no, it is relevant -- I think we "forgot" the power operator at some point. Are you aware of any semantic differences? I'll see if it passes revdepchecks so that we can enable the translation.
The obvious candidate seems the same in both systems:
There are aggregation functions that are available in DuckDB, but duckplyr still falls back to dplyr.
discovered when benchmarking duckplyr with the db-benchmark. This example comes from group by query q9
repro
test.csv
============================= OLD ISSUE BEFORE EDIT (CAN IGNORE) ======================
repro
~~
The occurs on group by query 9 of the db benchmark.
The text was updated successfully, but these errors were encountered: