odbc::dbConnect() generates a log file on each new session when working under a Debian 9 based OS, how to avoid this behaviour?

When runned under Raspbian Stretch (Debian Stretch), this code produces a log file on each new session, I can't reproduce this on Ubuntu 18 or Windows, how can I avoid this behaviour?

library(odbc)
connection_string <- glue("Driver={{PostgreSQL ANSI}};\\
                              Uid={Sys.getenv('MY_UID')};\\
                              Pwd={Sys.getenv('MY_PWD')};\\
                              Server=localhost;\\
                              Port=5432;\\
                              Database=sensors;")
con <- dbConnect(odbc::odbc(), .connection_string = connection_string, encoding = "utf8")
This is the sanitized content of the log

conn=0x72a2320, PGAPI_DriverConnect( in)='Driver={PostgreSQL ANSI};Uid=xxx;Pwd=xxxxxxx;Server=localhost;Port=5432;Database=sensors;', fDriverCompletion=0
Driver Version='09.05.0400,'
Global Options: fetch=100, unknown_sizes=0, max_varchar_size=255, max_longvarchar_size=8190
unique_index=1, use_declarefetch=0
text_as_longvarchar=1, unknowns_as_longvarchar=0, bools_as_char=1 NAMEDATALEN=64
extra_systable_prefixes='dd_', conn_settings='(null)' conn_encoding=''
conn=0x72a2320, query='SET DateStyle = 'ISO''
conn=0x72a2320, query='SET extra_float_digits = 2'
conn=0x72a2320, query='select oid, typbasetype from pg_type where typname = 'lo''
[ Large Object oid = -999 ]
[ Client encoding = 'UTF8' (code = 6) ]
conn=0x72a2320, PGAPI_DriverConnect(out)='DRIVER={PostgreSQL ANSI};DATABASE=sensors;SERVER=localhost;PORT=5432;UID=xxx;PWD=xxxxxx;SSLmode=disable;ReadOnly=0;Protocol=7.4;FakeOidIndex=0;ShowOidColumn=0;RowVersioning=0;ShowSystemTables=0;ConnSettings=;Fetch=100;UnknownSizes=0;MaxVarcharSize=255;MaxLongVarcharSize=8190;Debug=0;CommLog=1;UseDeclareFetch=0;TextAsLongVarchar=1;UnknownsAsLongVarchar=0;BoolsAsChar=1;Parse=0;ExtraSysTablePrefixes=dd_;LFConversion=0;UpdatableCursors=1;TrueIsMinus1=0;BI=0;ByteaAsLongVarBinary=0;UseServerSidePrepare=1;LowerCaseIdentifier=0;'
conn=0x72a2320, query='select NULL, NULL, relkind from (select 'r' as relkind union select 'v') as a'
conn=0x72a2320, query='select NULL, nspname, NULL from pg_catalog.pg_namespace n where true and nspname not in ('pg_catalog', 'information_schema', 'pg_toast', 'pg_temp_1') order by nspname'
conn=0x72a2320, query='select NULL, NULL, NULL'
conn=0x72a2320, query='select NULL, NULL, NULL'
conn=0x72a2320, query='select NULL, nspname, NULL from pg_catalog.pg_namespace n where true and nspname not in ('pg_catalog', 'information_schema', 'pg_toast', 'pg_temp_1') order by nspname'

sessionInfo()

R version 3.6.0 (2019-04-26)
Platform: armv7l-unknown-linux-gnueabihf (32-bit)
Running under: Raspbian GNU/Linux 9 (stretch)

Matrix products: default
BLAS: /usr/local/lib/R/lib/libRblas.so
LAPACK: /usr/local/lib/R/lib/libRlapack.so

locale:
[1] LC_CTYPE=es_PE.UTF-8 LC_NUMERIC=C LC_TIME=es_PE.UTF-8
[4] LC_COLLATE=es_PE.UTF-8 LC_MONETARY=es_PE.UTF-8 LC_MESSAGES=es_PE.UTF-8
[7] LC_PAPER=es_PE.UTF-8 LC_NAME=C LC_ADDRESS=C
[10] LC_TELEPHONE=C LC_MEASUREMENT=es_PE.UTF-8 LC_IDENTIFICATION=C

attached base packages:
[1] stats graphics grDevices utils datasets methods base

other attached packages:
[1] glue_1.3.1 odbc_1.1.6

loaded via a namespace (and not attached):
[1] bit_1.1-14 compiler_3.6.0 hms_0.4.2 DBI_1.0.0 tools_3.6.0
[6] Rcpp_1.0.1 bit64_0.9-7 blob_1.1.1 packrat_0.5.0 pkgconfig_2.0.2
[11] rlang_0.3.4

Note: This happens on RStudio and just R as well

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.