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
I'd like keyword highlighting, but the dark blue is hard to read with a dark grey background. Would be nice if the option allowed specifying a color, but failing that I'd like to be able to turn it off.
library(dplyr, w=F)
library(testthat, w=F)
#> Warning: package 'testthat' was built under R version 4.1.2con<-DBI::dbConnect(RSQLite::SQLite(), ":memory:")
copy_to(con, mtcars)
mtcars2<- tbl(con, "mtcars")
local_reproducible_output(crayon=TRUE)
options(dbplyr_use_colour=FALSE)
mtcars2 %>%
select(mpg) %>%
show_query()
#> <SQL>#> �[34mSELECT�[39m `mpg`#> �[34mFROM�[39m `mtcars`
Created on 2022-08-13 by the reprex package (v2.0.1.9000)
My workaround for now is below, but it would be nice if there was an option
style_kw <- function(x) {
if (dbplyr:::dbplyr_use_colour()) {
# use `br_blue` which is more legible for a dark theme
cli::col_br_blue(x)
} else {
x
}
}
assignInNamespace(
"style_kw",
style_kw,
asNamespace("dbplyr")
)
The text was updated successfully, but these errors were encountered:
eutwt
changed the title
How to turn keyword highlighting off
feature request: Turn keyword highlighting off
Aug 14, 2022
I'd like keyword highlighting, but the dark blue is hard to read with a dark grey background. Would be nice if the option allowed specifying a color, but failing that I'd like to be able to turn it off.
Created on 2022-08-13 by the reprex package (v2.0.1.9000)
My workaround for now is below, but it would be nice if there was an option
The text was updated successfully, but these errors were encountered: