Learn R Programming

⚠️There's a newer version (1.3.1) of this package.Take me there.

dtplyr

Overview

dtplyr provides a data.table backend for dplyr. The goal of dtplyr is to allow you to write dplyr code that is automatically translated to the equivalent, but usually much faster, data.table code.

Compared to the previous release, this version of dtplyr is a complete rewrite that focusses only on lazy evaluation triggered by use of lazy_dt(). This means that no computation is performed until you explicitly request it with as.data.table(), as.data.frame() or as_tibble(). This has a considerable advantage over the previous version (which eagerly evaluated each step) because it allows dtplyr to generate significantly more performant translations. This is a large change that breaks all existing uses of dtplyr. But frankly, dtplyr was pretty useless before because it did such a bad job of generating data.table code. Fortunately few people used it, so a major overhaul was possible.

See vignette("translation") for details of the current translations, and table.express and rqdatatable for related work.

Installation

You can install from CRAN with:

install.packages("dtplyr")

Or try the development version from GitHub with:

# install.packages("devtools")
devtools::install_github("tidyverse/dtplyr")

Usage

To use dtplyr, you must at least load dtplyr and dplyr. You may also want to load data.table so you can access the other goodies that it provides:

library(data.table)
library(dtplyr)
library(dplyr, warn.conflicts = FALSE)

Then use lazy_dt() to create a “lazy” data table that tracks the operations performed on it.

mtcars2 <- lazy_dt(mtcars)

You can preview the transformation (including the generated data.table code) by printing the result:

mtcars2 %>% 
  filter(wt < 5) %>% 
  mutate(l100k = 235.21 / mpg) %>% # liters / 100 km
  group_by(cyl) %>% 
  summarise(l100k = mean(l100k))
#> Source: local data table [3 x 2]
#> Call:   `_DT1`[wt < 5][, `:=`(l100k = 235.21/mpg)][, .(l100k = mean(l100k)), 
#>     keyby = .(cyl)]
#> 
#>     cyl l100k
#>   <dbl> <dbl>
#> 1     4  9.05
#> 2     6 12.0 
#> 3     8 14.9 
#> 
#> # Use as.data.table()/as.data.frame()/as_tibble() to access results

But generally you should reserve this only for debugging, and use as.data.table(), as.data.frame(), or as_tibble() to indicate that you’re done with the transformation and want to access the results:

mtcars2 %>% 
  filter(wt < 5) %>% 
  mutate(l100k = 235.21 / mpg) %>% # liters / 100 km
  group_by(cyl) %>% 
  summarise(l100k = mean(l100k)) %>% 
  as_tibble()
#> # A tibble: 3 × 2
#>     cyl l100k
#>   <dbl> <dbl>
#> 1     4  9.05
#> 2     6 12.0 
#> 3     8 14.9

Why is dtplyr slower than data.table?

There are three primary reasons that dtplyr will always be somewhat slower than data.table:

  • Each dplyr verb must do some work to convert dplyr syntax to data.table syntax. This takes time proportional to the complexity of the input code, not the input data, so should be a negligible overhead for large datasets. Initial benchmarks suggest that the overhead should be under 1ms per dplyr call.

  • Some data.table expressions have no direct dplyr equivalent. For example, there’s no way to express cross- or rolling-joins with dplyr.

  • To match dplyr semantics, mutate() does not modify in place by default. This means that most expressions involving mutate() must make a copy that would not be necessary if you were using data.table directly. (You can opt out of this behaviour in lazy_dt() with immutable = FALSE).

Code of Conduct

Please note that the dtplyr project is released with a Contributor Code of Conduct. By contributing to this project, you agree to abide by its terms.

Copy Link

Version

Install

install.packages('dtplyr')

Monthly Downloads

691,928

Version

1.3.0

License

MIT + file LICENSE

Issues

Pull Requests

Stars

Forks

Maintainer

Hadley Wickham

Last Published

February 24th, 2023

Functions in dtplyr (1.3.0)

complete.dtplyr_step

Complete a data frame with missing combinations of data
intersect.dtplyr_step

Set operations
count.dtplyr_step

Count observations by group
slice.dtplyr_step

Subset rows using their positions
dtplyr-package

dtplyr: Data Table Back-End for 'dplyr'
drop_na.dtplyr_step

Drop rows containing missing values
left_join.dtplyr_step

Join data tables
summarise.dtplyr_step

Summarise each group to one row
distinct.dtplyr_step

Subset distinct/unique rows
.datatable.aware

dtplyr is data.table aware
select.dtplyr_step

Subset columns using their names
separate.dtplyr_step

Separate a character column into multiple columns with a regular expression or numeric locations
mutate.dtplyr_step

Create and modify columns
group_by.dtplyr_step

Group and ungroup
filter.dtplyr_step

Subset rows using column values
pivot_wider.dtplyr_step

Pivot data from long to wide
relocate.dtplyr_step

Relocate variables using their names
collect.dtplyr_step

Force computation of a lazy data.table
arrange.dtplyr_step

Arrange rows by column values
unite.dtplyr_step

Unite multiple columns into one by pasting strings together.
transmute.dtplyr_step

Create new columns, dropping old
pivot_longer.dtplyr_step

Pivot data from wide to long
nest.dtplyr_step

Nest
expand.dtplyr_step

Expand data frame to include all possible combinations of values.
fill.dtplyr_step

Fill in missing values with previous or next value
group_modify.dtplyr_step

Apply a function to each group
replace_na.dtplyr_step

Replace NAs with specified values
rename.dtplyr_step

Rename columns using their names
head.dtplyr_step

Subset first or last rows
lazy_dt

Create a "lazy" data.table for use with dplyr verbs