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
Calls to compute(..., name=in_schema(...), temporary=FALSE) fail because connection object is not passed to as.sql(name) call in sql_query_save.DBIConnection. Similarly, when name=DBI::Id(..) same issue occurs.
library(dbplyr)
library(dplyr)
library(magrittr)
con<-...# This is DBI / RPostgres connectionDBI::dbExecute(con, "CREATE SCHEMA IF NOT EXISTS foo")
DBI::dbWriteTable(con,DBI::Id(schema='foo',table='bar'),tibble::tibble(x=1:2), overwrite=TRUE, append=FALSE)
tbl(con, in_schema('foo','bar')) %>% compute(in_schema('foo','baz'), temporary=FALSE)
Note frames 12,16,17 in the following stack trace:
Calls to
compute(..., name=in_schema(...), temporary=FALSE)
fail because connection object is not passed toas.sql(name)
call insql_query_save.DBIConnection
. Similarly, when name=DBI::Id(..) same issue occurs.Note frames 12,16,17 in the following stack trace:
The text was updated successfully, but these errors were encountered: