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.
explain()
1 parent 145ce56 commit 8005e5dCopy full SHA for 8005e5d
R/explain.R
@@ -5,10 +5,22 @@ explain.duckplyr_df <- function(x, ...) {
5
{
6
rel <- duckdb_rel_from_df(x)
7
rel_explain(rel)
8
- return(invisible())
+ return(invisible(x))
9
}
10
)
11
12
writeLines("Can't convert to relational, fallback implementation will be used.")
13
- invisible()
+ invisible(x)
14
+}
15
+
16
+duckplyr_explain <- function(.data, ...) {
17
+ try_fetch(
18
+ .data <- as_duckplyr_df(.data),
19
+ error = function(e) {
20
+ testthat::skip(conditionMessage(e))
21
+ }
22
+ )
23
+ out <- explain(.data, ...)
24
+ class(out) <- setdiff(class(out), "duckplyr_df")
25
+ invisible(out)
26
0 commit comments