Unfortunately not. 
I'm trying to implement a filter.myclass
that does basic translation for a where clause. It's not a real database back end but rather a list of metadata that will be used to send a query to a rest api.
A filter method like
filter.myclass <- function(x, ...) {
dbplyr::partial_eval(rlang::expr(...), vars = x[["cols"]][["names"]])
dbplyr::translate_sql(...)
}
get's 99% of the way there.
This will get all the way there for my purposes, so I'll settle on this.
filter.FeatureLayer <- function(x, ...) {
dbplyr::partial_eval(rlang::expr(...), vars = x[["cols"]][["names"]])
gsub("`", "", dbplyr::translate_sql(...))
}
I tried doing something like sql_escape_ident.myclass <- function(con, x) sql_quote(x, "")
but that didn't work like I anticipated.