Releases: tidyverse/duckplyr
duckplyr 1.0.0
Features
Large data
-
Improved support for handling large data from files and S3: ingestion with
read_parquet_duckdb()
and others, and materialization withas_duckdb_tibble()
,compute.duckplyr_df()
andcompute_file()
. Seevignette("large")
for details. -
Control automatic materialization of duckplyr frames with the new
prudence
argument toas_duckdb_tibble()
,duckdb_tibble()
,compute.duckplyr_df()
andcompute_file()
. Seevignette("prudence")
for details.
New functions
-
read_csv_duckdb()
and others, deprecatingduckplyr_df_from_csv()
anddf_from_csv()
(#210, #396, #459). -
read_sql_duckdb()
(experimental) to run SQL queries against the default DuckDB connection and return the result as a duckplyr frame (duckdb/duckdb-r#32, #397). -
db_exec()
to execute configuration queries against the default duckdb connection (#39, #165, #227, #404, #459). -
as_duckdb_tibble()
, replacesas_duckplyr_tibble()
andas_duckplyr_df()
(#383, #457) and supports dbplyr connections to a duckdb database (#86, #211, #226). -
compute_parquet()
andcompute_csv()
, implementcompute.duckplyr_df()
(#409, #430). -
fallback_config()
to create a configuration file for the settings that do not affect behavior (#216, #426). -
is_duckdb_tibble()
, deprecatesis_duckplyr_df()
(#391, #392). -
last_rel()
to retrieve the last relation object used in materialization (#209, #375). -
Add
"prudent_duckplyr_df"
class that stops automatic materialization and requirescollect()
(#381, #390).
Translations
-
Partial support for
across()
inmutate()
andsummarise()
(#296, #306, #318, @lionel-, @DavisVaughan). -
Implement
na.rm
handling forsum()
,min()
,max()
,any()
andall()
, with fallback for window functions (#205, #566). -
Handle
dplyr::desc()
(#550). -
Avoid forwarding
is.na()
tois.nan()
to support non-numeric data, avoid checking roundtrip for timestamp data (#482). -
Correctly handle missing values in
if_else()
. -
Limit number of items that can be handled with
%in%
(#319). -
duckdb_tibble()
checks if columns can be represented in DuckDB (#537). -
Fall back to dplyr when passing
multiple
with joins (#323).
Error messages
-
Improve fallback error message by explicitly materializing (#432, #456).
-
Point to the native CSV reader if encountering data frames read with readr (#127, #469).
-
Improve
as_duckdb_tibble()
error message for invalidx
(@maelle, #339).
Behavior
-
Depend on dplyr instead of reexporting all generics (#405). Nothing changes for users in scripts. When using duckplyr in a package, you now also need to import dplyr.
-
Fallback logging is now on by default, can be disabled with configuration (#422).
-
The default DuckDB connection is now based on a file, the location defaults to a subdirectory of
tempdir()
and can be controlled with theDUCKPLYR_TEMP_DIR
environment variable (#439, #448, #561). -
explain()
returns the input, invisibly (#331).
Bug fixes
-
Compute ptype only for join columns in a safe way without materialization, not for the entire data frame (#289).
-
Internal
expr_scrub()
(used for telemetry) can handle function-definitions (@toppyy, #268, #271). -
Harden telemetry code against invalid arguments (#321).
Documentation
-
New articles:
vignette("large")
,vignette("prudence")
,vignette("fallback")
,vignette("limits")
,vignette("developers")
,vignette("telemetry")
(#207, #504). -
New
flights_df()
used instead ofpalmerpenguins::penguins
(#408). -
Move to the tidyverse GitHub organization, new repository URL https://github.com/tidyverse/duckplyr/ (#225).
-
Avoid base pipe in examples for compatibility with R 4.0.0 (#463, #466).
Performance
duckplyr 0.4.1
Features
df_from_file()
and related functions support multiple files (#194, #195), show a clear error message for non-stringpath
arguments (#182), and create a tibble by default (#177).- New
as_duckplyr_tibble()
to convert a data frame to a duckplyr tibble (#177). - Support descending sort for character and other non-numeric data (@toppyy, #92, #175).
- Avoid setting memory limit (#193).
- Check compatibility of join columns (#168, #185).
- Explicitly list supported functions, add contributing guide, add analysis scripts for GitHub activity data (#179).
Documentation
- Add contributing guide (#179).
- Show a startup message at package load if telemetry is not configured (#188, #198).
?df_from_file
shows how to read multiple files (#181, #186) and how to specify CSV column types (#140, #189), and is shown correctly in reference index (#173, #190).- Discuss dbplyr in README (#145, #191).
- Add analysis scripts for GitHub activity data (#179).
duckplyr 0.4.0
Features
- Use built-in rfuns extension to implement equality and inequality operators, improve translation for
as.integer()
,NA
and%in%
(#83, #154, #148, #155, #159, #160). - Reexport non-deprecated dplyr functions (#144, #163).
library(duckplyr)
callsmethods_overwrite()
(#164).- Only allow constant patterns in
grepl()
. - Explicitly reject calls with named arguments for now.
- Reduce default memory limit to 1 GB.
Bug fixes
- Stricter type checks in the set operations
intersect()
,setdiff()
,symdiff()
,union()
, andunion_all()
(#169). - Distinguish between constant
NA
and those used in an expression (#157). head(-1)
forwards to the default implementation (#131, #156).- Fix cli syntax for internal error message (#151).
- More careful detection of row names in data frame.
- Always check roundtrip for timestamp columns.
left_join()
and other join functions callauto_copy()
.- Only reset expression depth if it has been set before.
- Require fallback if the result contains duplicate column names when ignoring case.
row_number()
returns integer.is.na(NaN)
isTRUE
.summarise(count = n(), count = n())
creates only one column namedcount
.- Correct wording in instructions for enabling fallback logging (@TimTaylor, #141).
Chore
Documentation
- Mention wildcards to read multiple files in
?df_from_file
(@andreranza, #133, #134).
Testing
duckplyr 0.3.2
duckplyr 0.3.1
Bug fixes
- Forbid reuse of new columns created in
summarise()
(#72, #106). summarise()
no longer restores subclass.- Disambiguate computation of
log10()
andlog()
. - Fix division by zero for positive and negative numbers.
Features
- New
fallback_sitrep()
and related functionality for collecting telemetry data (#102, #107, #110, #111, #115). No data is collected by default, only a message is displayed once per session and then every eight hours. Opt in or opt out by setting environment variables. - Implement
group_by()
and other methods to collect fallback information (#94, #104, #105). - Set memory limit and temporary directory for duckdb.
- Implement
suppressWarnings()
as the identity function. - Prefer
cli::cli_abort()
overstop()
orrlang::abort()
(#114). - Translate
.data$a
and.env$a
. - Strict checks for column class, only supporting
integer
,numeric
,logical
,Date
,POSIXct
, anddifftime
for now. - If the environment variable
DUCKPLYR_METHODS_OVERWRITE
is set toTRUE
, loading duckplyr automatically callsmethods_overwrite()
.
Internal
- Better duckdb tests.
- Use standalone purrr for dplyr compatibility.
Testing
- Add tests for correct base of
log()
andlog10()
.
Documentation
methods_overwrite()
andmethods_restore()
show a message.
duckplyr 0.3.0
## Bug fixes - `grepl(x = NA)` gives correct results. - Fix `auto_copy()` for non-data-frame input. - Add output order preservation for filters. - `distinct()` now preserves order in corner cases (#77, #78). - Consistent computation of `log(0)` and `log(-1)` (#75, #76). ## Features - Only allow constants in `mutate()` that are actually representable in duckdb (#73). - Avoid translating `ifelse()`, support `if_else()` (#79). ## Documentation - Separate and explain the new relational examples (@wibeasley, #84). ## Testing - Add test that TPC-H queries can be processed. ## Chore - Sync with dplyr 1.1.4 (#82). - Remove `dplyr_reconstruct()` method (#48). - Render README. - Fix code generated by `meta_replay()`. - Bump constructive dependency. - Fix output order for `arrange()` in case of ties. - Update duckdb tests. - Only implement newer `slice_sample()`, not `sample_n()` or `sample_frac()` (#74). - Sync generated files (#71).
duckplyr 0.2.3
Performance
- Join using
IS NOT DISTINCT FROM
for faster execution (duckdb/duckdb-r#41, #68).
Documentation
duckplyr 0.2.2
duckplyr 0.2.1
duckplyr 0.2.0
What's Changed
- Implement summarise() by @krlmlr in #1
- WIP: Draft support for window functions by @krlmlr in #4
- Benchmarking adjustments by @Tmonster in #6
- Revert prefix suffix optimizations, revert year extraction by @Tmonster in #7
- ci: add GHA standard check workflow by @maelle in #23
- docs: fix BugReports link by @maelle in #10
- Update scripts to run out of the box by @Tmonster in #8
- Various easy fixes after running R CMD check by @maelle in #16
- Make Duckplyr_df from csv more generic so it can be from json, parquet, csv et.c by @Tmonster in #32
- docs: document undocumented arguments by @maelle in #28
- chore: R CMD check fixes by @maelle in #42
- chore: More R CMD check fixes by @krlmlr in #43
- chore: Almost ready for CRAN by @krlmlr in #44
- feat: Order-stable
union_all()
by @krlmlr in #45 - Sync documentation with v0.1.0 by @krlmlr in #46
New Contributors
Full Changelog: https://github.com/duckdblabs/duckplyr/commits/v0.2.0