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
Hi!
Thanks for this amazing package. I'm getting "Error in n_distinct(year, na.rm = TRUE) : unused argument (na.rm = TRUE)" when trying to work on Azure Synapse, but not on DuckDB.
This works :
library(duckdb) # for local database example
library(pool)
library(dplyr)
library(dbplyr)
library(DBI)
gapdata <- gapminder::gapminder %>% mutate(date = as.Date(paste0(year, "-01-01"))) %>% filter(year >= 1990) %>% mutate(prout = NA_character_)
# Create a DuckDB connection pool (in-memory database)
pool <- dbPool(
drv = duckdb::duckdb(),
dbdir = ":memory:"
)
dbWriteTable(pool, SQL("gapdata"), gapdata)
tbl(pool, "gapdata") %>%
summarise(pouet = n_distinct(year, na.rm = TRUE))
Hi!
Thanks for this amazing package. I'm getting "Error in n_distinct(year, na.rm = TRUE) : unused argument (na.rm = TRUE)" when trying to work on Azure Synapse, but not on DuckDB.
This works :
This doesnt :
Error in n_distinct(year, na.rm = TRUE) : unused argument (na.rm = TRUE)
The text was updated successfully, but these errors were encountered: